confetti-0.3.1: A simple config file swapping tool

Safe HaskellNone
LanguageHaskell2010

Lib

Documentation

data ParseError a Source #

Instances
Show a => Show (ParseError a) Source # 
Instance details

Defined in Lib

Generic (ParseError a) Source # 
Instance details

Defined in Lib

Associated Types

type Rep (ParseError a) :: * -> * #

Methods

from :: ParseError a -> Rep (ParseError a) x #

to :: Rep (ParseError a) x -> ParseError a #

type Rep (ParseError a) Source # 
Instance details

Defined in Lib

type Rep (ParseError a) = D1 (MetaData "ParseError" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) ((C1 (MetaCons "ConfettiYamlNotFound" PrefixI False) (U1 :: * -> *) :+: C1 (MetaCons "GroupNotFound" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a))) :+: (C1 (MetaCons "ConfettiYamlInvalid" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)) :+: C1 (MetaCons "DuplicateNameError" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a))))

newtype ApplyError a Source #

Constructors

VariantsMissing [a] 
Instances
Show a => Show (ApplyError a) Source # 
Instance details

Defined in Lib

data SearchPath Source #

Constructors

SearchPath 
Instances
Eq SearchPath Source # 
Instance details

Defined in Lib

Show SearchPath Source # 
Instance details

Defined in Lib

Generic SearchPath Source # 
Instance details

Defined in Lib

Associated Types

type Rep SearchPath :: * -> * #

FromJSON SearchPath Source # 
Instance details

Defined in Lib

type Rep SearchPath Source # 
Instance details

Defined in Lib

type Rep SearchPath = D1 (MetaData "SearchPath" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) (C1 (MetaCons "SearchPath" PrefixI True) (S1 (MetaSel (Just "path") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 FilePath) :*: S1 (MetaSel (Just "recursive") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool))))

data ConfigGroup Source #

Constructors

ConfigGroup 
Instances
Show ConfigGroup Source # 
Instance details

Defined in Lib

Generic ConfigGroup Source # 
Instance details

Defined in Lib

Associated Types

type Rep ConfigGroup :: * -> * #

FromJSON ConfigGroup Source # 
Instance details

Defined in Lib

type Rep ConfigGroup Source # 
Instance details

Defined in Lib

data CommonConfigGroup Source #

Instances
Show CommonConfigGroup Source # 
Instance details

Defined in Lib

Generic CommonConfigGroup Source # 
Instance details

Defined in Lib

Associated Types

type Rep CommonConfigGroup :: * -> * #

FromJSON CommonConfigGroup Source # 
Instance details

Defined in Lib

type Rep CommonConfigGroup Source # 
Instance details

Defined in Lib

type Rep CommonConfigGroup = D1 (MetaData "CommonConfigGroup" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) (C1 (MetaCons "CommonConfigGroup" PrefixI True) (S1 (MetaSel (Just "commonTargets") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]) :*: S1 (MetaSel (Just "commonSearchPaths") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SearchPath]))))

data ParsedSpecFile Source #

Instances
Show ParsedSpecFile Source # 
Instance details

Defined in Lib

Generic ParsedSpecFile Source # 
Instance details

Defined in Lib

Associated Types

type Rep ParsedSpecFile :: * -> * #

FromJSON ParsedSpecFile Source # 
Instance details

Defined in Lib

type Rep ParsedSpecFile Source # 
Instance details

Defined in Lib

type Rep ParsedSpecFile = D1 (MetaData "ParsedSpecFile" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) (C1 (MetaCons "ParsedSpecFile" PrefixI True) (S1 (MetaSel (Just "groups") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ConfigGroup]) :*: S1 (MetaSel (Just "commonGroup") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe CommonConfigGroup))))