hamsql-0.9.0.0: Interpreter for SQL-structure definitions in YAML (YamSql)

Safe HaskellNone
LanguageHaskell2010

Database.YamSql

Synopsis

Documentation

data Schema Source #

Instances

Data Schema Source # 

Methods

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

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

toConstr :: Schema -> Constr #

dataTypeOf :: Schema -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Schema Source # 
Generic Schema Source # 

Associated Types

type Rep Schema :: * -> * #

Methods

from :: Schema -> Rep Schema x #

to :: Rep Schema x -> Schema #

ToJSON Schema Source # 
FromJSON Schema Source # 
ToSqlId (SqlContext (Schema, Domain)) Source # 
ToSqlId (SqlContext (Schema, Function)) Source # 
ToSqlId (SqlContext (Schema, Sequence)) Source # 
ToSqlId (SqlContext (Schema, Table)) Source # 
ToSqlId (SqlContext (Schema, Type)) Source # 
ToSqlId (SqlContext (Schema, Table, Column)) Source # 
ToSqlId (SqlContext Schema) Source # 
type Rep Schema Source # 
type Rep Schema = D1 (MetaData "Schema" "Database.YamSql.Internal.Obj.Schema" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "Schema" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "schemaName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) (S1 (MetaSel (Just Symbol "schemaDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))) ((:*:) (S1 (MetaSel (Just Symbol "schemaDependencies") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) ((:*:) (S1 (MetaSel (Just Symbol "schemaFunctions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Function]))) (S1 (MetaSel (Just Symbol "schemaFunctionTemplates") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [FunctionTpl])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "schemaTables") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Table]))) (S1 (MetaSel (Just Symbol "schemaTableTemplates") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [TableTpl])))) ((:*:) (S1 (MetaSel (Just Symbol "schemaRoles") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Role]))) ((:*:) (S1 (MetaSel (Just Symbol "schemaSequences") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Sequence]))) (S1 (MetaSel (Just Symbol "schemaPrivUsage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "schemaPrivSelectAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "schemaPrivInsertAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName])))) ((:*:) (S1 (MetaSel (Just Symbol "schemaPrivUpdateAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) ((:*:) (S1 (MetaSel (Just Symbol "schemaPrivDeleteAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "schemaPrivSequenceAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "schemaPrivExecuteAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) ((:*:) (S1 (MetaSel (Just Symbol "schemaPrivAllAll") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "schemaDomains") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Domain]))))) ((:*:) (S1 (MetaSel (Just Symbol "schemaTypes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Type]))) ((:*:) (S1 (MetaSel (Just Symbol "schemaExecPostInstall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "schemaExecPostInstallAndUpgrade") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)))))))))

data Check Source #

Constructors

Check 

Instances

Data Check Source # 

Methods

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

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

toConstr :: Check -> Constr #

dataTypeOf :: Check -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Check Source # 

Methods

showsPrec :: Int -> Check -> ShowS #

show :: Check -> String #

showList :: [Check] -> ShowS #

Generic Check Source # 

Associated Types

type Rep Check :: * -> * #

Methods

from :: Check -> Rep Check x #

to :: Rep Check x -> Check #

ToJSON Check Source # 
FromJSON Check Source # 
type Rep Check Source # 
type Rep Check = D1 (MetaData "Check" "Database.YamSql.Internal.Obj.Check" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "Check" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "checkName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) ((:*:) (S1 (MetaSel (Just Symbol "checkDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "checkCheck") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))))

data Domain Source #

Domains are aliases of an existing SQL types, possibly with checks

Instances

Data Domain Source # 

Methods

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

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

toConstr :: Domain -> Constr #

dataTypeOf :: Domain -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Domain Source # 
Generic Domain Source # 

Associated Types

type Rep Domain :: * -> * #

Methods

from :: Domain -> Rep Domain x #

to :: Rep Domain x -> Domain #

ToJSON Domain Source # 
FromJSON Domain Source # 
ToSqlId (SqlContext (Schema, Domain)) Source # 
type Rep Domain Source # 

data Function Source #

Constructors

Function 

Fields

Instances

Data Function Source # 

Methods

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

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

toConstr :: Function -> Constr #

dataTypeOf :: Function -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Function Source # 
Generic Function Source # 

Associated Types

type Rep Function :: * -> * #

Methods

from :: Function -> Rep Function x #

to :: Rep Function x -> Function #

ToJSON Function Source # 
FromJSON Function Source # 
ToSqlId (SqlContext (Schema, Function)) Source # 
type Rep Function Source # 
type Rep Function = D1 (MetaData "Function" "Database.YamSql.Internal.Obj.Function" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "Function" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "functionName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) ((:*:) (S1 (MetaSel (Just Symbol "functionDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "functionReturns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlType)))) ((:*:) (S1 (MetaSel (Just Symbol "functionParameters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Variable]))) ((:*:) (S1 (MetaSel (Just Symbol "functionTemplates") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "functionTemplateData") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [FunctionTpl])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "functionReturnsColumns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Parameter]))) ((:*:) (S1 (MetaSel (Just Symbol "functionVariables") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Variable]))) (S1 (MetaSel (Just Symbol "functionPrivExecute") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "functionSecurityDefiner") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "functionOwner") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SqlName)))) ((:*:) (S1 (MetaSel (Just Symbol "functionLanguage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "functionBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))))))

data FunctionTpl Source #

Instances

Data FunctionTpl Source # 

Methods

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

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

toConstr :: FunctionTpl -> Constr #

dataTypeOf :: FunctionTpl -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FunctionTpl Source # 
Generic FunctionTpl Source # 

Associated Types

type Rep FunctionTpl :: * -> * #

ToJSON FunctionTpl Source # 
FromJSON FunctionTpl Source # 
WithName (WithSchema FunctionTpl) Source # 
type Rep FunctionTpl Source # 
type Rep FunctionTpl = D1 (MetaData "FunctionTpl" "Database.YamSql.Internal.Obj.Function" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "FunctionTpl" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "functiontplTemplate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) (S1 (MetaSel (Just Symbol "functiontplDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text))) ((:*:) (S1 (MetaSel (Just Symbol "functiontplLanguage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "functiontplParameters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Variable]))) (S1 (MetaSel (Just Symbol "functiontplVariables") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Variable])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "functiontplPrivExecute") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "functiontplSecurityDefiner") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool)))) ((:*:) (S1 (MetaSel (Just Symbol "functiontplOwner") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SqlName))) ((:*:) (S1 (MetaSel (Just Symbol "functiontplBodyPrelude") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "functiontplBodyPostlude") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))))))

data Role Source #

Instances

Data Role Source # 

Methods

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

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

toConstr :: Role -> Constr #

dataTypeOf :: Role -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Role Source # 

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Generic Role Source # 

Associated Types

type Rep Role :: * -> * #

Methods

from :: Role -> Rep Role x #

to :: Rep Role x -> Role #

ToJSON Role Source # 
FromJSON Role Source # 
ToSqlId (SqlContext Role) Source # 
type Rep Role Source # 

data Sequence Source #

Instances

Data Sequence Source # 

Methods

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

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

toConstr :: Sequence -> Constr #

dataTypeOf :: Sequence -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Sequence Source # 
Generic Sequence Source # 

Associated Types

type Rep Sequence :: * -> * #

Methods

from :: Sequence -> Rep Sequence x #

to :: Rep Sequence x -> Sequence #

ToJSON Sequence Source # 
FromJSON Sequence Source # 
ToSqlId (SqlContext (Schema, Sequence)) Source # 
type Rep Sequence Source # 

data Table Source #

Instances

Data Table Source # 

Methods

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

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

toConstr :: Table -> Constr #

dataTypeOf :: Table -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Table Source # 

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Generic Table Source # 

Associated Types

type Rep Table :: * -> * #

Methods

from :: Table -> Rep Table x #

to :: Rep Table x -> Table #

ToJSON Table Source # 
FromJSON Table Source # 
ToSqlId (SqlContext (Schema, Table)) Source # 
ToSqlId (SqlContext (Schema, Table, Column)) Source # 
type Rep Table Source # 
type Rep Table = D1 (MetaData "Table" "Database.YamSql.Internal.Obj.Table" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "Table" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "tableName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) ((:*:) (S1 (MetaSel (Just Symbol "tableDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "tableColumns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Column])))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "tablePrimaryKey") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SqlName])) (S1 (MetaSel (Just Symbol "tableUnique") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [UniqueKey])))) ((:*:) (S1 (MetaSel (Just Symbol "tableForeignKeys") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ForeignKey]))) (S1 (MetaSel (Just Symbol "tableChecks") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Check])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "tableInherits") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) ((:*:) (S1 (MetaSel (Just Symbol "tablePrivSelect") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "tablePrivInsert") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "tablePrivUpdate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "tablePrivDelete") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName])))) ((:*:) (S1 (MetaSel (Just Symbol "tableTemplates") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SqlName]))) (S1 (MetaSel (Just Symbol "tableTemplateData") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [TableTpl]))))))))

data TableTpl Source #

Instances

Data TableTpl Source # 

Methods

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

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

toConstr :: TableTpl -> Constr #

dataTypeOf :: TableTpl -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TableTpl Source # 
Generic TableTpl Source # 

Associated Types

type Rep TableTpl :: * -> * #

Methods

from :: TableTpl -> Rep TableTpl x #

to :: Rep TableTpl x -> TableTpl #

ToJSON TableTpl Source # 
FromJSON TableTpl Source # 
WithName (WithSchema TableTpl) Source # 
type Rep TableTpl Source # 

data Column Source #

Instances

Data Column Source # 

Methods

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

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

toConstr :: Column -> Constr #

dataTypeOf :: Column -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Column Source # 
Generic Column Source # 

Associated Types

type Rep Column :: * -> * #

Methods

from :: Column -> Rep Column x #

to :: Rep Column x -> Column #

ToJSON Column Source # 
FromJSON Column Source # 
ToSqlId (SqlContext (Schema, Table, Column)) Source # 
type Rep Column Source # 

data UniqueKey Source #

Instances

Data UniqueKey Source # 

Methods

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

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

toConstr :: UniqueKey -> Constr #

dataTypeOf :: UniqueKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UniqueKey Source # 
Generic UniqueKey Source # 

Associated Types

type Rep UniqueKey :: * -> * #

ToJSON UniqueKey Source # 
FromJSON UniqueKey Source # 
type Rep UniqueKey Source # 
type Rep UniqueKey = D1 (MetaData "UniqueKey" "Database.YamSql.Internal.Obj.Table" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "UniqueKey" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "uniquekeyName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) (S1 (MetaSel (Just Symbol "uniquekeyColumns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SqlName]))))

data ForeignKey Source #

Instances

Data ForeignKey Source # 

Methods

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

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

toConstr :: ForeignKey -> Constr #

dataTypeOf :: ForeignKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ForeignKey Source # 
Generic ForeignKey Source # 

Associated Types

type Rep ForeignKey :: * -> * #

ToJSON ForeignKey Source # 
FromJSON ForeignKey Source # 
type Rep ForeignKey Source # 
type Rep ForeignKey = D1 (MetaData "ForeignKey" "Database.YamSql.Internal.Obj.Table" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "ForeignKey" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "foreignkeyName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) ((:*:) (S1 (MetaSel (Just Symbol "foreignkeyColumns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SqlName])) (S1 (MetaSel (Just Symbol "foreignkeyRefTable") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)))) ((:*:) (S1 (MetaSel (Just Symbol "foreignkeyRefColumns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SqlName])) ((:*:) (S1 (MetaSel (Just Symbol "foreignkeyOnDelete") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "foreignkeyOnUpdate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)))))))

data Type Source #

Instances

Data Type Source # 

Methods

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

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

toConstr :: Type -> Constr #

dataTypeOf :: Type -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Type Source # 

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Generic Type Source # 

Associated Types

type Rep Type :: * -> * #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

ToJSON Type Source # 
FromJSON Type Source # 
ToSqlId (SqlContext (Schema, Type)) Source # 
type Rep Type Source # 
type Rep Type = D1 (MetaData "Type" "Database.YamSql.Internal.Obj.Type" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "Type" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "typeName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) ((:*:) (S1 (MetaSel (Just Symbol "typeDescription") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) (S1 (MetaSel (Just Symbol "typeElements") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [TypeElement])))))

data TypeElement Source #

Instances

Data TypeElement Source # 

Methods

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

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

toConstr :: TypeElement -> Constr #

dataTypeOf :: TypeElement -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TypeElement Source # 
Generic TypeElement Source # 

Associated Types

type Rep TypeElement :: * -> * #

ToJSON TypeElement Source # 
FromJSON TypeElement Source # 
type Rep TypeElement Source # 
type Rep TypeElement = D1 (MetaData "TypeElement" "Database.YamSql.Internal.Obj.Type" "hamsql-0.9.0.0-Awb9FWiLMC5A5FEzDLLpRc" False) (C1 (MetaCons "TypeElement" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "typeelementName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlName)) (S1 (MetaSel (Just Symbol "typeelementType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SqlType))))