krapsh-0.1.6.1: Haskell bindings for Spark Dataframes and Datasets

Safe HaskellNone
LanguageHaskell2010

Spark.Core.Types

Synopsis

Documentation

data DataType Source #

All the data types supported by the Spark engine. The data types can either be nullable (they may contain null values) or strict (all the values are present). There are a couple of differences with the algebraic data types in Haskell: Maybe (Maybe a) ~ Maybe a which implies that arbitrary nesting of values will be flattened to a top-level Nullable Similarly, [[]] ~ []

data Nullable Source #

Represents the choice between a strict and a nullable field

Constructors

CanNull 
NoNull 

class TupleEquivalence to tup | to -> tup where Source #

A class that expresses the fact that a certain type (that is well-formed) is equivalent to a tuple of points.

Useful for auto conversions between tuples of columns and data structures.

Minimal complete definition

tupleFieldNames

Instances

TupleEquivalence (a1, a2) (a1, a2) Source # 

Methods

tupleFieldNames :: NameTuple (a1, a2) Source #

data NameTuple to Source #

Constructors

NameTuple [String] 

data SQLType a Source #

A tagged datatype that encodes the sql types This is the main type information that should be used by users.

Instances

Eq (SQLType a) Source # 

Methods

(==) :: SQLType a -> SQLType a -> Bool #

(/=) :: SQLType a -> SQLType a -> Bool #

Show (SQLType a) Source # 

Methods

showsPrec :: Int -> SQLType a -> ShowS #

show :: SQLType a -> String #

showList :: [SQLType a] -> ShowS #

Generic (SQLType a) Source # 

Associated Types

type Rep (SQLType a) :: * -> * #

Methods

from :: SQLType a -> Rep (SQLType a) x #

to :: Rep (SQLType a) x -> SQLType a #

type Rep (SQLType a) Source # 
type Rep (SQLType a) = D1 (MetaData "SQLType" "Spark.Core.Internal.TypesStructures" "krapsh-0.1.6.1-24YumfFSIoWDNUVRZjuyVp" False) (C1 (MetaCons "SQLType" PrefixI True) (S1 (MetaSel (Just Symbol "unSQLType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 DataType)))

class SQLTypeable a Source #

Instances

SQLTypeable Int Source # 

Methods

_genericTypeFromValue :: Int -> GenericType

_buildType :: SQLType Int

SQLTypeable String Source # 
SQLTypeable Text Source # 

Methods

_genericTypeFromValue :: Text -> GenericType

_buildType :: SQLType Text

SQLTypeable a => SQLTypeable [a] Source # 

Methods

_genericTypeFromValue :: [a] -> GenericType

_buildType :: SQLType [a]

SQLTypeable a => SQLTypeable (Maybe a) Source # 

Methods

_genericTypeFromValue :: Maybe a -> GenericType

_buildType :: SQLType (Maybe a)

(SQLTypeable a2, SQLTypeable a1) => SQLTypeable (a1, a2) Source # 

Methods

_genericTypeFromValue :: (a1, a2) -> GenericType

_buildType :: SQLType (a1, a2)

castType :: forall a b. SQLTypeable b => SQLType a -> Try (SQLType b) Source #

Description of types supported in DataSets Krapsh supports a restrictive subset of Algebraic Datatypes that is amenable to SQL transformations. This file contains the description of all the supported types, and some conversion tools.

catNodePath :: NodePath -> Text Source #

The concatenated path. This is the inverse function of fieldPath.