zifter-0.0.1.6: zifter

Safe HaskellSafe
LanguageHaskell2010

Zifter.OptParse.Types

Documentation

data Flags Source #

Instances

Eq Flags Source # 

Methods

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

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

Show Flags Source # 

Methods

showsPrec :: Int -> Flags -> ShowS #

show :: Flags -> String #

showList :: [Flags] -> ShowS #

data Dispatch Source #

Instances

Eq Dispatch Source # 
Show Dispatch Source # 
Generic Dispatch Source # 

Associated Types

type Rep Dispatch :: * -> * #

Methods

from :: Dispatch -> Rep Dispatch x #

to :: Rep Dispatch x -> Dispatch #

type Rep Dispatch Source # 
type Rep Dispatch = D1 * (MetaData "Dispatch" "Zifter.OptParse.Types" "zifter-0.0.1.6-I0Wu9n3BFZIGTS85x2GK39" False) ((:+:) * ((:+:) * (C1 * (MetaCons "DispatchRun" PrefixI False) (U1 *)) (C1 * (MetaCons "DispatchInstall" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Bool)))) ((:+:) * (C1 * (MetaCons "DispatchPreProcess" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "DispatchPreCheck" PrefixI False) (U1 *)) (C1 * (MetaCons "DispatchCheck" PrefixI False) (U1 *)))))

data Settings Source #

Instances

Eq Settings Source # 
Show Settings Source # 
Generic Settings Source # 

Associated Types

type Rep Settings :: * -> * #

Methods

from :: Settings -> Rep Settings x #

to :: Rep Settings x -> Settings #

type Rep Settings Source # 
type Rep Settings = D1 * (MetaData "Settings" "Zifter.OptParse.Types" "zifter-0.0.1.6-I0Wu9n3BFZIGTS85x2GK39" False) (C1 * (MetaCons "Settings" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "setsOutputColor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Bool)) (S1 * (MetaSel (Just Symbol "setsOutputMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * OutputMode))))

data OutputMode Source #

Constructors

OutputLinear 
OutputFast 

Instances

Eq OutputMode Source # 
Show OutputMode Source # 
Generic OutputMode Source # 

Associated Types

type Rep OutputMode :: * -> * #

type Rep OutputMode Source # 
type Rep OutputMode = D1 * (MetaData "OutputMode" "Zifter.OptParse.Types" "zifter-0.0.1.6-I0Wu9n3BFZIGTS85x2GK39" False) ((:+:) * (C1 * (MetaCons "OutputLinear" PrefixI False) (U1 *)) (C1 * (MetaCons "OutputFast" PrefixI False) (U1 *)))