Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Special command parameters governing the aggregation of the entire (rest of the) argument list into one value.
Documentation
When this type is used as the (last) parameter of a command handler function, all remaining tokens passed to the command will be consumed and stored in this type.
The command will be declared with the -nargs=*
or -nargs=+
option.
See CommandHandler
.
Instances
IsString Args Source # | |
Defined in Ribosome.Host.Data.Args fromString :: String -> Args # | |
Show Args Source # | |
Eq Args Source # | |
Ord Args Source # | |
Member (Stop Report) r => HandlerArg Args r Source # | |
Defined in Ribosome.Host.Handler.Codec | |
SpecialParam ('OptionState al count ('Nothing :: Maybe Type)) Args Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count 'Nothing) Args :: OptionState Source # | |
type TransSpecial ('OptionState al count ('Nothing :: Maybe Type)) Args Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ('Nothing :: Maybe Type)) Args = 'OptionState 'True (Max count 'MinZero) ('Just Args) |
When this type is used as the (last) parameter of a command handler function, all remaining tokens passed to the command will be consumed and stored in this type, as a list of whitespace separated tokens.
The command will be declared with the -nargs=*
or -nargs=+
option.
See CommandHandler
.
Instances
Show ArgList Source # | |
Eq ArgList Source # | |
Member (Stop Report) r => HandlerArg ArgList r Source # | |
Defined in Ribosome.Host.Handler.Codec | |
SpecialParam ('OptionState al count ac) ArgList Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ac) ArgList :: OptionState Source # | |
type TransSpecial ('OptionState al count ac) ArgList Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ac) ArgList = 'OptionState 'True (Max count 'MinZero) ('Just ArgList) |
When this type is used as the (last) parameter of a command handler function, all remaining tokens passed to the command will be consumed, decoded as JSON and stored in this type.
The command will be declared with the -nargs=*
or -nargs=+
option.
See CommandHandler
.
JsonArgs | |
|
Instances
Show a => Show (JsonArgs a) Source # | |
Eq a => Eq (JsonArgs a) Source # | |
(Member (Stop Report) r, FromJSON a) => HandlerArg (JsonArgs a) r Source # | |
Defined in Ribosome.Host.Handler.Codec | |
SpecialParam ('OptionState al count ac) (JsonArgs a) Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ac) (JsonArgs a) :: OptionState Source # | |
type TransSpecial ('OptionState al count ac) (JsonArgs a) Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ac) (JsonArgs a) = 'OptionState 'True (Max count 'MinZero) ('Just (JsonArgs a)) |
When this type is used as the (last) parameter of a command handler function, all remaining tokens passed to the command will be consumed, parsed via optparse-applicative and stored in this type.
The parser associated with a
must be defined as an instance of
.OptionParser
a
The command will be declared with the -nargs=*
or -nargs=+
option.
See CommandHandler
.
Options a |
Instances
Show a => Show (Options a) Source # | |
Eq a => Eq (Options a) Source # | |
(Member (Stop Report) r, OptionParser a) => HandlerArg (Options a) r Source # | |
Defined in Ribosome.Host.Handler.Codec | |
SpecialParam ('OptionState al count ('Nothing :: Maybe Type)) (Options a) Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count 'Nothing) (Options a) :: OptionState Source # | |
type TransSpecial ('OptionState al count ('Nothing :: Maybe Type)) (Options a) Source # | |
Defined in Ribosome.Host.Handler.Command type TransSpecial ('OptionState al count ('Nothing :: Maybe Type)) (Options a) = 'OptionState 'True (Max count 'MinZero) ('Just (Options a)) |
class OptionParser a where Source #
The parser used when declaring command handlers with the special parameter
.Options
a
optionParser :: Parser a Source #