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

Options.Harg.Sources.NoSource

Synopsis

Documentation

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

Throwaway type whose GetSource instance returns no value.

Instances

Instances details
GetSource NoSource f Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

Associated Types

type SourceVal NoSource Source #

Generic (NoSource f) Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

Associated Types

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

Methods

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

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

ApplicativeB NoSource Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

Methods

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

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

FunctorB NoSource Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

Methods

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

TraversableB NoSource Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

Methods

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

type SourceVal NoSource Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

type Rep (NoSource f) Source # 
Instance details

Defined in Options.Harg.Sources.NoSource

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

noSources :: NoSource f Source #

Shorthand for writing NoSource.