feedback-0.1.0.1: Declarative feedback loop manager
Safe HaskellSafe-Inferred
LanguageHaskell2010

Feedback.Common.OptParse

Documentation

data LoopSettings Source #

Instances

Instances details
Generic LoopSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep LoopSettings :: Type -> Type #

Show LoopSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq LoopSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep LoopSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep LoopSettings = D1 ('MetaData "LoopSettings" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "LoopSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "loopSettingRunSettings") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RunSettings) :*: (S1 ('MetaSel ('Just "loopSettingFilterSettings") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FilterSettings) :*: S1 ('MetaSel ('Just "loopSettingOutputSettings") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 OutputSettings))))

data RunSettings Source #

Instances

Instances details
Generic RunSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep RunSettings :: Type -> Type #

Show RunSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq RunSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep RunSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep RunSettings = D1 ('MetaData "RunSettings" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" '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 OutputSettings Source #

Constructors

OutputSettings 

Instances

Instances details
Generic OutputSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep OutputSettings :: Type -> Type #

Show OutputSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq OutputSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputSettings = D1 ('MetaData "OutputSettings" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "OutputSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "outputSettingClear") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Clear)))

data FilterSettings Source #

Instances

Instances details
Generic FilterSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep FilterSettings :: Type -> Type #

Show FilterSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq FilterSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep FilterSettings Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep FilterSettings = D1 ('MetaData "FilterSettings" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "FilterSettings" 'PrefixI 'True) (S1 ('MetaSel ('Just "filterSettingGitignore") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Just "filterSettingFind") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe String))))

data Configuration Source #

Instances

Instances details
FromJSON Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

ToJSON Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

HasCodec Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep Configuration :: Type -> Type #

Show Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Configuration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Configuration = D1 ('MetaData "Configuration" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "Configuration" 'PrefixI 'True) (S1 ('MetaSel ('Just "configLoops") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map String LoopConfiguration)) :*: S1 ('MetaSel ('Just "configOutputConfiguration") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe OutputConfiguration))))

data LoopConfiguration Source #

Instances

Instances details
FromJSON LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

ToJSON LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

HasCodec LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep LoopConfiguration :: Type -> Type #

Show LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep LoopConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep LoopConfiguration = D1 ('MetaData "LoopConfiguration" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "LoopConfiguration" 'PrefixI 'True) ((S1 ('MetaSel ('Just "loopConfigDescription") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "loopConfigRunConfiguration") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RunConfiguration)) :*: (S1 ('MetaSel ('Just "loopConfigFilterConfiguration") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FilterConfiguration) :*: S1 ('MetaSel ('Just "loopConfigOutputConfiguration") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 OutputConfiguration))))

data RunConfiguration Source #

Instances

Instances details
FromJSON RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

ToJSON RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

HasCodec RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep RunConfiguration :: Type -> Type #

Show RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep RunConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep RunConfiguration = D1 ('MetaData "RunConfiguration" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "RunConfiguration" 'PrefixI 'True) (S1 ('MetaSel ('Just "runConfigCommand") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Command) :*: (S1 ('MetaSel ('Just "runConfigExtraEnv") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map String String)) :*: S1 ('MetaSel ('Just "runConfigWorkingDir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FilePath)))))

data FilterConfiguration Source #

Instances

Instances details
FromJSON FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

ToJSON FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

HasCodec FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep FilterConfiguration :: Type -> Type #

Show FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep FilterConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep FilterConfiguration = D1 ('MetaData "FilterConfiguration" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "FilterConfiguration" 'PrefixI 'True) (S1 ('MetaSel ('Just "filterConfigGitignore") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "filterConfigFind") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe String))))

data OutputConfiguration Source #

Instances

Instances details
FromJSON OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

ToJSON OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

HasCodec OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Semigroup OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep OutputConfiguration :: Type -> Type #

Show OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputConfiguration Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputConfiguration = D1 ('MetaData "OutputConfiguration" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "OutputConfiguration" 'PrefixI 'True) (S1 ('MetaSel ('Just "outputConfigClear") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Clear))))

data Environment Source #

Constructors

Environment 

Instances

Instances details
Generic Environment Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep Environment :: Type -> Type #

Show Environment Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq Environment Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Environment Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Environment = D1 ('MetaData "Environment" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "envConfigFile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FilePath))))

data Flags Source #

Instances

Instances details
Generic Flags Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep Flags :: Type -> Type #

Methods

from :: Flags -> Rep Flags x #

to :: Rep Flags x -> Flags #

Show Flags Source # 
Instance details

Defined in Feedback.Common.OptParse

Methods

showsPrec :: Int -> Flags -> ShowS #

show :: Flags -> String #

showList :: [Flags] -> ShowS #

Eq Flags Source # 
Instance details

Defined in Feedback.Common.OptParse

Methods

(==) :: Flags -> Flags -> Bool #

(/=) :: Flags -> Flags -> Bool #

type Rep Flags Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Flags = D1 ('MetaData "Flags" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" '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 #

Instances

Instances details
Generic OutputFlags Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep OutputFlags :: Type -> Type #

Show OutputFlags Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq OutputFlags Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputFlags Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep OutputFlags = D1 ('MetaData "OutputFlags" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" '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)))

data Command Source #

Instances

Instances details
Generic Command Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep Command :: Type -> Type #

Methods

from :: Command -> Rep Command x #

to :: Rep Command x -> Command #

Show Command Source # 
Instance details

Defined in Feedback.Common.OptParse

Eq Command Source # 
Instance details

Defined in Feedback.Common.OptParse

Methods

(==) :: Command -> Command -> Bool #

(/=) :: Command -> Command -> Bool #

type Rep Command Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Command = D1 ('MetaData "Command" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "CommandArgs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)) :+: C1 ('MetaCons "CommandScript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)))

data Clear Source #

Instances

Instances details
HasCodec Clear Source # 
Instance details

Defined in Feedback.Common.OptParse

Generic Clear Source # 
Instance details

Defined in Feedback.Common.OptParse

Associated Types

type Rep Clear :: Type -> Type #

Methods

from :: Clear -> Rep Clear x #

to :: Rep Clear x -> Clear #

Show Clear Source # 
Instance details

Defined in Feedback.Common.OptParse

Methods

showsPrec :: Int -> Clear -> ShowS #

show :: Clear -> String #

showList :: [Clear] -> ShowS #

Eq Clear Source # 
Instance details

Defined in Feedback.Common.OptParse

Methods

(==) :: Clear -> Clear -> Bool #

(/=) :: Clear -> Clear -> Bool #

type Rep Clear Source # 
Instance details

Defined in Feedback.Common.OptParse

type Rep Clear = D1 ('MetaData "Clear" "Feedback.Common.OptParse" "feedback-0.1.0.1-BKmQXNiQY57DZMs68SA8W1" 'False) (C1 ('MetaCons "ClearScreen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoNotClearScreen" 'PrefixI 'False) (U1 :: Type -> Type))