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

Options.Harg.Sources.Env

Synopsis

Documentation

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

Source that enables a parser to read options from environment variables.

Constructors

EnvSource 

Instances

Instances details
GetSource EnvSource f Source # 
Instance details

Defined in Options.Harg.Sources.Env

Associated Types

type SourceVal EnvSource Source #

Generic (EnvSource f) Source # 
Instance details

Defined in Options.Harg.Sources.Env

Associated Types

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

Methods

from :: EnvSource f -> Rep (EnvSource f) x #

to :: Rep (EnvSource f) x -> EnvSource f #

ApplicativeB EnvSource Source # 
Instance details

Defined in Options.Harg.Sources.Env

Methods

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

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

FunctorB EnvSource Source # 
Instance details

Defined in Options.Harg.Sources.Env

Methods

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

TraversableB EnvSource Source # 
Instance details

Defined in Options.Harg.Sources.Env

Methods

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

type SourceVal EnvSource Source # 
Instance details

Defined in Options.Harg.Sources.Env

type Rep (EnvSource f) Source # 
Instance details

Defined in Options.Harg.Sources.Env

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

newtype EnvSourceVal Source #

Value of EnvSource, which is an association list between environment variable names and values (strings).

Instances

Instances details
(FunctorB a, TraversableB a) => RunSource EnvSourceVal a Source # 
Instance details

Defined in Options.Harg.Sources.Env

Methods

runSource :: forall (f :: Type -> Type). Applicative f => EnvSourceVal -> a (Compose Opt f) -> [Either SourceRunError (a (Compose SourceRunResult f))] Source #