Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- class HasApiOptions (action :: Action) where
- data ServerConfig = ServerConfig {}
- defaultServerConfig :: ServerConfig
- mkServerConfig :: String -> Q [Dec]
- getApiOptionsMap :: Q Exp
- dropPrefix :: String -> String -> String
- dropSuffix :: String -> String -> String
- dropFirstWord :: String -> String
- data Name
Documentation
data ServerConfig Source #
Configuration used to generate server
This is expected to be generated by mkServerConfig
. It is only explicit due to
the GHC stage restrictions.
ServerConfig | |
|
Instances
Generic ServerConfig Source # | |
Defined in DomainDriven.Server.Config type Rep ServerConfig :: Type -> Type # from :: ServerConfig -> Rep ServerConfig x # to :: Rep ServerConfig x -> ServerConfig # | |
Show ServerConfig Source # | |
Defined in DomainDriven.Server.Config showsPrec :: Int -> ServerConfig -> ShowS # show :: ServerConfig -> String # showList :: [ServerConfig] -> ShowS # | |
type Rep ServerConfig Source # | |
Defined in DomainDriven.Server.Config type Rep ServerConfig = D1 ('MetaData "ServerConfig" "DomainDriven.Server.Config" "domaindriven-0.5.0-DXvek89qD5M1xwQ4V40Syp" 'False) (C1 ('MetaCons "ServerConfig" 'PrefixI 'True) (S1 ('MetaSel ('Just "allApiOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map String ApiOptions)))) |
mkServerConfig :: String -> Q [Dec] Source #
Generate a server configuration and give it the specified name
getApiOptionsMap :: Q Exp Source #
Generates `Map String ApiOptions` Containing the ApiOptions of all types with an ApiOpts instance
dropFirstWord :: String -> String Source #
An abstract type representing names in the syntax tree.
Name
s can be constructed in several ways, which come with different
name-capture guarantees (see Language.Haskell.TH.Syntax for
an explanation of name capture):
- the built-in syntax
'f
and''T
can be used to construct names, The expression'f
gives aName
which refers to the valuef
currently in scope, and''T
gives aName
which refers to the typeT
currently in scope. These names can never be captured. lookupValueName
andlookupTypeName
are similar to'f
and''T
respectively, but theName
s are looked up at the point where the current splice is being run. These names can never be captured.newName
monadically generates a new name, which can never be captured.mkName
generates a capturable name.
Names constructed using newName
and mkName
may be used in bindings
(such as let x = ...
or x -> ...
), but names constructed using
lookupValueName
, lookupTypeName
, 'f
, ''T
may not.
Instances
Data Name | |
Defined in Language.Haskell.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name # dataTypeOf :: Name -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) # gmapT :: (forall b. Data b => b -> b) -> Name -> Name # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # | |
Generic Name | |
Show Name | |
Eq Name | |
Ord Name | |
Ppr Name | |
type Rep Name | |
Defined in Language.Haskell.TH.Syntax type Rep Name = D1 ('MetaData "Name" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Name" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OccName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NameFlavour))) |