Safe Haskell | None |
---|---|
Language | Haskell2010 |
System.Etc.Internal.Spec.Types
Documentation
data CliOptValueType Source #
Instances
data CliArgValueType Source #
Instances
Eq CliArgValueType Source # | |
Defined in System.Etc.Internal.Spec.Types Methods (==) :: CliArgValueType -> CliArgValueType -> Bool # (/=) :: CliArgValueType -> CliArgValueType -> Bool # | |
Show CliArgValueType Source # | |
Defined in System.Etc.Internal.Spec.Types Methods showsPrec :: Int -> CliArgValueType -> ShowS # show :: CliArgValueType -> String # showList :: [CliArgValueType] -> ShowS # | |
Generic CliArgValueType Source # | |
Defined in System.Etc.Internal.Spec.Types Associated Types type Rep CliArgValueType :: * -> * # Methods from :: CliArgValueType -> Rep CliArgValueType x # to :: Rep CliArgValueType x -> CliArgValueType # | |
Lift CliArgValueType Source # | |
Defined in System.Etc.Internal.Spec.Types Methods lift :: CliArgValueType -> Q Exp # | |
type Rep CliArgValueType Source # | |
data CliOptMetadata Source #
Constructors
CliOptMetadata | |
Instances
data CliArgMetadata Source #
Constructors
CliArgMetadata | |
Fields
|
Instances
data CliSwitchMetadata Source #
Constructors
CliSwitchMetadata | |
Fields
|
Instances
data CliEntryMetadata Source #
Constructors
Opt CliOptMetadata | |
Arg CliArgMetadata | |
Switch CliSwitchMetadata |
Instances
data CliEntrySpec cmd Source #
Constructors
CmdEntry | |
Fields
| |
PlainEntry | |
Fields |
Instances
data CliCmdSpec Source #
Constructors
CliCmdSpec | |
Fields
|
Instances
Eq CliCmdSpec Source # | |
Defined in System.Etc.Internal.Spec.Types | |
Show CliCmdSpec Source # | |
Defined in System.Etc.Internal.Spec.Types Methods showsPrec :: Int -> CliCmdSpec -> ShowS # show :: CliCmdSpec -> String # showList :: [CliCmdSpec] -> ShowS # | |
Generic CliCmdSpec Source # | |
Defined in System.Etc.Internal.Spec.Types Associated Types type Rep CliCmdSpec :: * -> * # | |
Lift CliCmdSpec Source # | |
Defined in System.Etc.Internal.Spec.Types Methods lift :: CliCmdSpec -> Q Exp # | |
FromJSON CliCmdSpec # | |
Defined in System.Etc.Internal.Spec.Parser | |
type Rep CliCmdSpec Source # | |
Defined in System.Etc.Internal.Spec.Types type Rep CliCmdSpec = D1 (MetaData "CliCmdSpec" "System.Etc.Internal.Spec.Types" "etc-0.4.1.0-7q0W6i0k47BIqxo3Mr9o9p" False) (C1 (MetaCons "CliCmdSpec" PrefixI True) (S1 (MetaSel (Just "cliCmdDesc") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "cliCmdHeader") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))) |
data ConfigSources cmd Source #
Constructors
ConfigSources | |
Instances
data SingleConfigValueType Source #
Instances
data ConfigValueType Source #
Constructors
CVTSingle !SingleConfigValueType | |
CVTArray !SingleConfigValueType |
Instances
data ConfigValue cmd Source #
Constructors
ConfigValue | |
Fields
| |
SubConfig | |
Fields
|
Instances
data CliProgramSpec Source #
Constructors
CliProgramSpec | |
Fields
|
Instances
Constructors
FilePathsSpec ![Text] | |
FilesSpec | |
Fields
|
Instances
Eq FilesSpec Source # | |
Show FilesSpec Source # | |
Generic FilesSpec Source # | |
Lift FilesSpec Source # | |
type Rep FilesSpec Source # | |
Defined in System.Etc.Internal.Spec.Types type Rep FilesSpec = D1 (MetaData "FilesSpec" "System.Etc.Internal.Spec.Types" "etc-0.4.1.0-7q0W6i0k47BIqxo3Mr9o9p" False) (C1 (MetaCons "FilePathsSpec" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Text])) :+: C1 (MetaCons "FilesSpec" PrefixI True) (S1 (MetaSel (Just "fileLocationEnvVar") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "fileLocationPaths") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 [Text]))) |
data ConfigSpec cmd Source #
Constructors
ConfigSpec | |
Fields
|