Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Feedback.Common.OptParse
Documentation
data LoopSettings Source #
Constructors
LoopSettings | |
Instances
combineToLoopSettings :: Flags -> Environment -> Maybe OutputConfiguration -> LoopConfiguration -> IO LoopSettings Source #
data RunSettings Source #
Constructors
RunSettings | |
Fields
|
Instances
Generic RunSettings Source # | |
Defined in Feedback.Common.OptParse Associated Types type Rep RunSettings :: Type -> Type # | |
Show RunSettings Source # | |
Defined in Feedback.Common.OptParse Methods showsPrec :: Int -> RunSettings -> ShowS # show :: RunSettings -> String # showList :: [RunSettings] -> ShowS # | |
Eq RunSettings Source # | |
Defined in Feedback.Common.OptParse | |
type Rep RunSettings Source # | |
Defined in Feedback.Common.OptParse type Rep RunSettings = D1 ('MetaData "RunSettings" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "RunSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "runSettingCommand") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Command) :*: (S1 ('MetaSel ('Just "runSettingExtraEnv") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map String String)) :*: S1 ('MetaSel ('Just "runSettingWorkingDir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (Path Abs Dir)))))) |
data FilterSettings Source #
Constructors
FilterSettings | |
Fields
|
Instances
data OutputSettings Source #
Constructors
OutputSettings | |
Fields |
Instances
Generic OutputSettings Source # | |
Defined in Feedback.Common.OptParse Associated Types type Rep OutputSettings :: Type -> Type # Methods from :: OutputSettings -> Rep OutputSettings x # to :: Rep OutputSettings x -> OutputSettings # | |
Show OutputSettings Source # | |
Defined in Feedback.Common.OptParse Methods showsPrec :: Int -> OutputSettings -> ShowS # show :: OutputSettings -> String # showList :: [OutputSettings] -> ShowS # | |
Eq OutputSettings Source # | |
Defined in Feedback.Common.OptParse Methods (==) :: 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 #
Constructors
HooksSettings | |
Instances
Generic HooksSettings Source # | |
Defined in Feedback.Common.OptParse Associated Types type Rep HooksSettings :: Type -> Type # | |
Show HooksSettings Source # | |
Defined in Feedback.Common.OptParse Methods showsPrec :: Int -> HooksSettings -> ShowS # show :: HooksSettings -> String # showList :: [HooksSettings] -> ShowS # | |
Eq HooksSettings Source # | |
Defined in Feedback.Common.OptParse Methods (==) :: HooksSettings -> HooksSettings -> Bool # (/=) :: HooksSettings -> HooksSettings -> Bool # | |
type Rep HooksSettings Source # | |
Defined in Feedback.Common.OptParse type Rep HooksSettings = D1 ('MetaData "HooksSettings" "Feedback.Common.OptParse" "feedback-0.1.0.4-KNDWcRKjcfDJSCjyiHZLaw" 'False) (C1 ('MetaCons "HooksSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "hooksSettingBeforeAll") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RunSettings)) :*: S1 ('MetaSel ('Just "hooksSettingAfterFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RunSettings)))) |
data Configuration Source #
Constructors
Configuration | |
Fields |
Instances
data LoopConfiguration Source #
Constructors
LoopConfiguration | |
Instances
data RunConfiguration Source #
Constructors
RunConfiguration | |
Fields
|
Instances
data FilterConfiguration Source #
Constructors
FilterConfiguration | |
Fields
|
Instances
data OutputConfiguration Source #
Constructors
OutputConfiguration | |
Fields
|
Instances
data HooksConfiguration Source #
Constructors
HooksConfiguration | |
Instances
getConfiguration :: Flags -> Environment -> IO (Maybe Configuration) Source #
getConfigurationFromFile :: Path Abs File -> IO (Maybe Configuration) Source #
data Environment Source #
Constructors
Environment | |
Fields
|
Instances
Generic Environment Source # | |
Defined in Feedback.Common.OptParse Associated Types type Rep Environment :: Type -> Type # | |
Show Environment Source # | |
Defined in Feedback.Common.OptParse Methods showsPrec :: Int -> Environment -> ShowS # show :: Environment -> String # showList :: [Environment] -> ShowS # | |
Eq Environment Source # | |
Defined in Feedback.Common.OptParse | |
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 #
Constructors
Flags | |
Fields
|
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 #
Constructors
OutputFlags | |
Fields
|
Instances
Generic OutputFlags Source # | |
Defined in Feedback.Common.OptParse Associated Types type Rep OutputFlags :: Type -> Type # | |
Show OutputFlags Source # | |
Defined in Feedback.Common.OptParse Methods showsPrec :: Int -> OutputFlags -> ShowS # show :: OutputFlags -> String # showList :: [OutputFlags] -> ShowS # | |
Eq OutputFlags Source # | |
Defined in Feedback.Common.OptParse | |
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 #
Constructors
CommandScript | |