harg-0.5.0.0: Haskell program configuration using higher kinded data
Safe HaskellNone
LanguageHaskell2010

Options.Harg.Sources.DefaultStr

Synopsis

Documentation

data DefaultStrSource (f :: Type -> Type) Source #

Source that enables a parser to read options from defaults that are provided as strings (unparsed).

Constructors

DefaultStrSource 

Instances

Instances details
GetSource DefaultStrSource f Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

Associated Types

type SourceVal DefaultStrSource Source #

Generic (DefaultStrSource f) Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

Associated Types

type Rep (DefaultStrSource f) :: Type -> Type #

ApplicativeB DefaultStrSource Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

Methods

bpure :: (forall (a :: k). f a) -> DefaultStrSource f

bprod :: forall (f :: k -> Type) (g :: k -> Type). DefaultStrSource f -> DefaultStrSource g -> DefaultStrSource (Product f g)

FunctorB DefaultStrSource Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

Methods

bmap :: (forall (a :: k). f a -> g a) -> DefaultStrSource f -> DefaultStrSource g

TraversableB DefaultStrSource Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

Methods

btraverse :: Applicative e => (forall (a :: k). f a -> e (g a)) -> DefaultStrSource f -> e (DefaultStrSource g)

type SourceVal DefaultStrSource Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

type Rep (DefaultStrSource f) Source # 
Instance details

Defined in Options.Harg.Sources.DefaultStr

type Rep (DefaultStrSource f) = D1 ('MetaData "DefaultStrSource" "Options.Harg.Sources.DefaultStr" "harg-0.5.0.0-inplace" 'False) (C1 ('MetaCons "DefaultStrSource" 'PrefixI 'False) (U1 :: Type -> Type))