hamsql-0.8.0.0: HamSql

Safe HaskellNone
LanguageHaskell2010

Database.HamSql.Setup

Synopsis

Documentation

class Typeable a => ToSqlStmts a where Source #

Minimal complete definition

toSqlStmts

data Setup Source #

Setup

Instances

Data Setup Source # 

Methods

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

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

toConstr :: Setup -> Constr #

dataTypeOf :: Setup -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Setup Source # 

Methods

showsPrec :: Int -> Setup -> ShowS #

show :: Setup -> String #

showList :: [Setup] -> ShowS #

Generic Setup Source # 

Associated Types

type Rep Setup :: * -> * #

Methods

from :: Setup -> Rep Setup x #

to :: Rep Setup x -> Setup #

FromJSON Setup Source # 
ToJSON Setup Source # 
type Rep Setup Source # 

data WithSchema a Source #

Template handling and applyTemplate

Constructors

WithSchema Schema a 

class WithName a where Source #

Minimal complete definition

name

Methods

name :: a -> Text Source #