Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
data LoopSettings Source #
Instances
combineToLoopSettings :: Flags -> Environment -> Maybe OutputConfiguration -> LoopConfiguration -> IO LoopSettings Source #
data RunSettings Source #
RunSettings | |
|
Instances
data FilterSettings Source #
Instances
data OutputSettings Source #
Instances
Generic OutputSettings Source # | |
Defined in Feedback.Common.OptParse type Rep OutputSettings :: Type -> Type # from :: OutputSettings -> Rep OutputSettings x # to :: Rep OutputSettings x -> OutputSettings # | |
Show OutputSettings Source # | |
Defined in Feedback.Common.OptParse showsPrec :: Int -> OutputSettings -> ShowS # show :: OutputSettings -> String # showList :: [OutputSettings] -> ShowS # | |
Eq OutputSettings Source # | |
Defined in Feedback.Common.OptParse (==) :: OutputSettings -> OutputSettings -> Bool # (/=) :: OutputSettings -> OutputSettings -> Bool # | |
type Rep OutputSettings Source # | |
Defined in Feedback.Common.OptParse type Rep OutputSettings = D1 ('MetaData "OutputSettings" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "OutputSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "outputSettingClear") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Clear))) |
data HooksSettings Source #
Instances
data Configuration Source #
Instances
data LoopConfiguration Source #
Instances
data RunConfiguration Source #
RunConfiguration | |
|
Instances
data FilterConfiguration Source #
Instances
data OutputConfiguration Source #
Instances
data HooksConfiguration Source #
Instances
getConfiguration :: Flags -> Environment -> IO (Maybe Configuration) Source #
getConfigurationFromFile :: Path Abs File -> IO (Maybe Configuration) Source #
data Environment Source #
Instances
Generic Environment Source # | |
Defined in Feedback.Common.OptParse type Rep Environment :: Type -> Type # from :: Environment -> Rep Environment x # to :: Rep Environment x -> Environment # | |
Show Environment Source # | |
Defined in Feedback.Common.OptParse showsPrec :: Int -> Environment -> ShowS # show :: Environment -> String # showList :: [Environment] -> ShowS # | |
Eq Environment Source # | |
Defined in Feedback.Common.OptParse (==) :: Environment -> Environment -> Bool # (/=) :: Environment -> Environment -> Bool # | |
type Rep Environment Source # | |
Defined in Feedback.Common.OptParse type Rep Environment = D1 ('MetaData "Environment" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "envConfigFile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FilePath)))) |
prefs_ :: ParserPrefs Source #
Flags | |
|
Instances
Generic Flags Source # | |
Show Flags Source # | |
Eq Flags Source # | |
type Rep Flags Source # | |
Defined in Feedback.Common.OptParse type Rep Flags = D1 ('MetaData "Flags" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "Flags" 'PrefixI 'True) (S1 ('MetaSel ('Just "flagCommand") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String) :*: (S1 ('MetaSel ('Just "flagConfigFile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FilePath)) :*: S1 ('MetaSel ('Just "flagOutputFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 OutputFlags)))) |
data OutputFlags Source #
OutputFlags | |
|
Instances
Generic OutputFlags Source # | |
Defined in Feedback.Common.OptParse type Rep OutputFlags :: Type -> Type # from :: OutputFlags -> Rep OutputFlags x # to :: Rep OutputFlags x -> OutputFlags # | |
Show OutputFlags Source # | |
Defined in Feedback.Common.OptParse showsPrec :: Int -> OutputFlags -> ShowS # show :: OutputFlags -> String # showList :: [OutputFlags] -> ShowS # | |
Eq OutputFlags Source # | |
Defined in Feedback.Common.OptParse (==) :: OutputFlags -> OutputFlags -> Bool # (/=) :: OutputFlags -> OutputFlags -> Bool # | |
type Rep OutputFlags Source # | |
Defined in Feedback.Common.OptParse type Rep OutputFlags = D1 ('MetaData "OutputFlags" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "OutputFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "outputFlagClear") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Clear)) :*: S1 ('MetaSel ('Just "outputFlagDebug") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) |
parseFlags :: Parser Flags Source #