napkin-backend-postgres-redshift-2.0.0
Safe HaskellNone
LanguageGHC2024

Napkin.Types.Redshift

Documentation

data Redshift #

Instances

Instances details
Data Redshift # 
Instance details

Defined in Napkin.Types.Redshift

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Redshift -> c Redshift #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Redshift #

toConstr :: Redshift -> Constr #

dataTypeOf :: Redshift -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Redshift) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Redshift) #

gmapT :: (forall b. Data b => b -> b) -> Redshift -> Redshift #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Redshift -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Redshift -> r #

gmapQ :: (forall d. Data d => d -> u) -> Redshift -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Redshift -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Redshift -> m Redshift #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Redshift -> m Redshift #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Redshift -> m Redshift #

HasPostgresConn Redshift # 
Instance details

Defined in Napkin.Run.Redshift

Backend Redshift # 
Instance details

Defined in Napkin.Run.Redshift

Associated Types

data BackendConn Redshift 
Instance details

Defined in Napkin.Run.Redshift

Methods

backendConnectionString :: BackendConn Redshift -> ConnectionString #

backendExecute :: (MonadNapkin Redshift m, RenderSql command Redshift) => BackendConn Redshift -> command -> m () #

backendQuery :: (MonadNapkin Redshift m, RenderSql q Redshift) => BackendConn Redshift -> q -> m [Map Text Value] #

backendCheckTableExists :: MonadNapkin Redshift m => BackendConn Redshift -> Ref Table -> m Bool #

backendGetTableKind :: MonadNapkin Redshift m => BackendConn Redshift -> Ref Table -> m TableKind #

backendGetRelationSchema :: MonadNapkin Redshift m => BackendConn Redshift -> Ref Table -> Relation -> m [BackendSchemaField Redshift] #

backendGetAnnotations :: MonadNapkin Redshift m => BackendConn Redshift -> Ref Table -> m TableAnnotations #

backendAnnotate :: MonadNapkin Redshift m => BackendConn Redshift -> Ref Table -> Annotation -> m () #

backendCreateAs :: (command ~ CreateRelation Redshift, RenderSql command Redshift, MonadNapkin Redshift m) => BackendConn Redshift -> command -> m () #

backendCreate :: (command ~ CreateTableSchema Redshift, RenderSql command Redshift, MonadNapkin Redshift m) => BackendConn Redshift -> command -> m () #

backendCopyTable :: (MonadNapkin Redshift m, RenderSql DeleteRows Redshift, RenderSql InsertInto Redshift, RenderSql (CreateRelation Redshift) Redshift, Default (BackendMeta 'KindTable Redshift)) => BackendConn Redshift -> Ref Table -> Ref Table -> TableWriteStrategy -> m () #

backendDrop :: MonadNapkin Redshift m => BackendConn Redshift -> DropRelation -> m () #

backendInsertInto :: (command ~ InsertInto, RenderSql command Redshift, MonadNapkin Redshift m) => BackendConn Redshift -> command -> m () #

backendRename :: MonadNapkin Redshift m => BackendConn Redshift -> RenameRelation -> m () #

backendListTables :: MonadNapkin Redshift m => BackendConn Redshift -> ListTables -> m (Set ListedTable) #

backendNormalize :: MonadNapkin Redshift m => BackendConn Redshift -> NormalizeTableNames -> m (Map (Ref Table) NormalizedTable) #

RunBackendConn Redshift # 
Instance details

Defined in Napkin.Run.Redshift

BackendName Redshift # 
Instance details

Defined in Napkin.Types.Redshift

Methods

backendName :: Text #

NapkinParserDialect Redshift # 
Instance details

Defined in Napkin.Types.Redshift

BackendOperators Redshift # 
Instance details

Defined in Napkin.Revert.Redshift

CSVImport Redshift # 
Instance details

Defined in Napkin.Run.Redshift

HasBackendSchemaField Redshift # 
Instance details

Defined in Napkin.Run.Redshift

HasBackendQueryStats Redshift # 
Instance details

Defined in Napkin.Run.Redshift

Associated Types

data BackendQueryStats Redshift 
Instance details

Defined in Napkin.Run.Redshift

SqlConcat Redshift # 
Instance details

Defined in Napkin.Untyped.Ops.Portable.Redshift

Methods

concat :: [SExp] -> SExp #

RenderSql SetTableSchema Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql DistStyle Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql SortKey Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql SortStyle Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql AnnotateTableOrView Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql DropRelation Redshift # 
Instance details

Defined in Napkin.Render.Redshift

RenderSql RenameRelation Redshift # 
Instance details

Defined in Napkin.Render.Redshift

SimpleTypeName Postgres a => SimpleTypeName Redshift a # 
Instance details

Defined in Napkin.Revert.Redshift

Methods

simpleName :: String #

RenderSql (CreateRelation Redshift) Redshift # 
Instance details

Defined in Napkin.Render.Redshift

FromJSON (YamlBackendMaterializedViewMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

FromJSON (YamlBackendTableMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

FromJSON (YamlBackendViewMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

FromJSON (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Default (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Generic (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Associated Types

type Rep (DbBackendOptions Redshift) 
Instance details

Defined in Napkin.Run.Redshift

type Rep (DbBackendOptions Redshift) = D1 ('MetaData "DbBackendOptions" "Napkin.Run.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'True) (C1 ('MetaCons "RedshiftOptions" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural)))
Show (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Eq (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

MaybeDefault (YamlBackendMaterializedViewMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

MaybeDefault (YamlBackendTableMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

MaybeDefault (YamlBackendViewMeta Redshift) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

FromJSON (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

ToJSON (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Monoid (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Semigroup (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Generic (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Associated Types

type Rep (BackendQueryStats Redshift) 
Instance details

Defined in Napkin.Run.Redshift

type Rep (BackendQueryStats Redshift) = D1 ('MetaData "BackendQueryStats" "Napkin.Run.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "BackendQueryStats" 'PrefixI 'False) (U1 :: Type -> Type))
Show (BackendSchemaField Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Show (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Eq (BackendSchemaField Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

Eq (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

FromRow (BackendSchemaField Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

data BackendConn Redshift # 
Instance details

Defined in Napkin.Run.Redshift

data BackendSpecificEffect Redshift m a # 
Instance details

Defined in Napkin.Run.Effects.Languages.Backend.Redshift

type BackendMaterializedViewMeta Redshift # 
Instance details

Defined in Napkin.Types.Redshift

type BackendTableMeta Redshift # 
Instance details

Defined in Napkin.Types.Redshift

type BackendViewMeta Redshift # 
Instance details

Defined in Napkin.Types.Redshift

newtype DbBackendOptions Redshift # 
Instance details

Defined in Napkin.Run.Redshift

data BackendSchemaField Redshift # 
Instance details

Defined in Napkin.Run.Redshift

data BackendQueryStats Redshift # 
Instance details

Defined in Napkin.Run.Redshift

type Rep (DbBackendOptions Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

type Rep (DbBackendOptions Redshift) = D1 ('MetaData "DbBackendOptions" "Napkin.Run.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'True) (C1 ('MetaCons "RedshiftOptions" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural)))
type Rep (BackendQueryStats Redshift) # 
Instance details

Defined in Napkin.Run.Redshift

type Rep (BackendQueryStats Redshift) = D1 ('MetaData "BackendQueryStats" "Napkin.Run.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "BackendQueryStats" 'PrefixI 'False) (U1 :: Type -> Type))

data TableMeta #

Constructors

TableMeta 

Instances

Instances details
Default TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: TableMeta #

Data TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableMeta -> c TableMeta #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableMeta #

toConstr :: TableMeta -> Constr #

dataTypeOf :: TableMeta -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableMeta) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableMeta) #

gmapT :: (forall b. Data b => b -> b) -> TableMeta -> TableMeta #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableMeta -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableMeta -> r #

gmapQ :: (forall d. Data d => d -> u) -> TableMeta -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TableMeta -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableMeta -> m TableMeta #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableMeta -> m TableMeta #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableMeta -> m TableMeta #

Generic TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

Associated Types

type Rep TableMeta 
Instance details

Defined in Napkin.Types.Redshift

type Rep TableMeta = D1 ('MetaData "TableMeta" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "TableMeta" 'PrefixI 'True) ((S1 ('MetaSel ('Just "local") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "temp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "distStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DistStyle) :*: S1 ('MetaSel ('Just "sorting") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SortKey)))))
Show TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

Eq TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

type Rep TableMeta # 
Instance details

Defined in Napkin.Types.Redshift

type Rep TableMeta = D1 ('MetaData "TableMeta" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "TableMeta" 'PrefixI 'True) ((S1 ('MetaSel ('Just "local") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "temp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "distStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DistStyle) :*: S1 ('MetaSel ('Just "sorting") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SortKey)))))

data DistStyle #

Constructors

DistEven 
DistKey SExp 
DistAll 

Instances

Instances details
FromJSON DistStyle # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

Default DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: DistStyle #

Data DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DistStyle -> c DistStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DistStyle #

toConstr :: DistStyle -> Constr #

dataTypeOf :: DistStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DistStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DistStyle) #

gmapT :: (forall b. Data b => b -> b) -> DistStyle -> DistStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DistStyle -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DistStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> DistStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DistStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DistStyle -> m DistStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DistStyle -> m DistStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DistStyle -> m DistStyle #

Generic DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

Associated Types

type Rep DistStyle 
Instance details

Defined in Napkin.Types.Redshift

type Rep DistStyle = D1 ('MetaData "DistStyle" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "DistEven" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DistKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)) :+: C1 ('MetaCons "DistAll" 'PrefixI 'False) (U1 :: Type -> Type)))
Show DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

Eq DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

RenderSql DistStyle Redshift # 
Instance details

Defined in Napkin.Render.Redshift

type Rep DistStyle # 
Instance details

Defined in Napkin.Types.Redshift

type Rep DistStyle = D1 ('MetaData "DistStyle" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "DistEven" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DistKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)) :+: C1 ('MetaCons "DistAll" 'PrefixI 'False) (U1 :: Type -> Type)))

data SortStyle #

Instances

Instances details
FromJSON SortStyle # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

Default SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: SortStyle #

Data SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SortStyle -> c SortStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SortStyle #

toConstr :: SortStyle -> Constr #

dataTypeOf :: SortStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SortStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SortStyle) #

gmapT :: (forall b. Data b => b -> b) -> SortStyle -> SortStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SortStyle -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SortStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> SortStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SortStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SortStyle -> m SortStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SortStyle -> m SortStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SortStyle -> m SortStyle #

Generic SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

Associated Types

type Rep SortStyle 
Instance details

Defined in Napkin.Types.Redshift

type Rep SortStyle = D1 ('MetaData "SortStyle" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "SortCompound" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SortInterleaved" 'PrefixI 'False) (U1 :: Type -> Type))
Show SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

Eq SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

RenderSql SortStyle Redshift # 
Instance details

Defined in Napkin.Render.Redshift

type Rep SortStyle # 
Instance details

Defined in Napkin.Types.Redshift

type Rep SortStyle = D1 ('MetaData "SortStyle" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "SortCompound" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SortInterleaved" 'PrefixI 'False) (U1 :: Type -> Type))

data SortKey #

Constructors

SortKey SortStyle [SExp] 

Instances

Instances details
FromJSON SortKey # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.Redshift

Data SortKey # 
Instance details

Defined in Napkin.Types.Redshift

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SortKey -> c SortKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SortKey #

toConstr :: SortKey -> Constr #

dataTypeOf :: SortKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SortKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SortKey) #

gmapT :: (forall b. Data b => b -> b) -> SortKey -> SortKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SortKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SortKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> SortKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SortKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SortKey -> m SortKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SortKey -> m SortKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SortKey -> m SortKey #

Generic SortKey # 
Instance details

Defined in Napkin.Types.Redshift

Associated Types

type Rep SortKey 
Instance details

Defined in Napkin.Types.Redshift

type Rep SortKey = D1 ('MetaData "SortKey" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "SortKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SortStyle) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])))

Methods

from :: SortKey -> Rep SortKey x #

to :: Rep SortKey x -> SortKey #

Show SortKey # 
Instance details

Defined in Napkin.Types.Redshift

Eq SortKey # 
Instance details

Defined in Napkin.Types.Redshift

Methods

(==) :: SortKey -> SortKey -> Bool #

(/=) :: SortKey -> SortKey -> Bool #

RenderSql SortKey Redshift # 
Instance details

Defined in Napkin.Render.Redshift

type Rep SortKey # 
Instance details

Defined in Napkin.Types.Redshift

type Rep SortKey = D1 ('MetaData "SortKey" "Napkin.Types.Redshift" "napkin-backend-postgres-redshift-2.0.0-J3UFNsryji7KyuggPsq12S" 'False) (C1 ('MetaCons "SortKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SortStyle) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])))