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

Options.Harg.Sources.YAML

Synopsis

Documentation

newtype YAMLSource f Source #

Source that enables a parser to read options from a YAML file.

Constructors

YAMLSource (f ConfigFile) 

Instances

Instances details
GetSource YAMLSource Identity Source # 
Instance details

Defined in Options.Harg.Sources.YAML

Associated Types

type SourceVal YAMLSource Source #

Generic (YAMLSource f) Source # 
Instance details

Defined in Options.Harg.Sources.YAML

Associated Types

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

Methods

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

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

ApplicativeB YAMLSource Source # 
Instance details

Defined in Options.Harg.Sources.YAML

Methods

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

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

FunctorB YAMLSource Source # 
Instance details

Defined in Options.Harg.Sources.YAML

Methods

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

TraversableB YAMLSource Source # 
Instance details

Defined in Options.Harg.Sources.YAML

Methods

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

type SourceVal YAMLSource Source # 
Instance details

Defined in Options.Harg.Sources.YAML

type Rep (YAMLSource f) Source # 
Instance details

Defined in Options.Harg.Sources.YAML

type Rep (YAMLSource f) = D1 ('MetaData "YAMLSource" "Options.Harg.Sources.YAML" "harg-0.5.0.0-inplace" 'True) (C1 ('MetaCons "YAMLSource" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f ConfigFile))))