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

Options.Harg.Sources.JSON

Synopsis

Documentation

newtype JSONSource f Source #

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

Constructors

JSONSource (f ConfigFile) 

Instances

Instances details
GetSource JSONSource Identity Source # 
Instance details

Defined in Options.Harg.Sources.JSON

Associated Types

type SourceVal JSONSource Source #

Generic (JSONSource f) Source # 
Instance details

Defined in Options.Harg.Sources.JSON

Associated Types

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

Methods

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

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

ApplicativeB JSONSource Source # 
Instance details

Defined in Options.Harg.Sources.JSON

Methods

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

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

FunctorB JSONSource Source # 
Instance details

Defined in Options.Harg.Sources.JSON

Methods

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

TraversableB JSONSource Source # 
Instance details

Defined in Options.Harg.Sources.JSON

Methods

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

type SourceVal JSONSource Source # 
Instance details

Defined in Options.Harg.Sources.JSON

type Rep (JSONSource f) Source # 
Instance details

Defined in Options.Harg.Sources.JSON

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