confetti-1.0.0: A simple config file swapping tool

Safe HaskellNone
LanguageHaskell2010

Confetti

Documentation

data ParseError a Source #

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

Defined in Confetti

Generic (ParseError a) Source # 
Instance details

Defined in Confetti

Associated Types

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

Methods

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

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

type Rep (ParseError a) Source # 
Instance details

Defined in Confetti

type Rep (ParseError a) = D1 (MetaData "ParseError" "Confetti" "confetti-1.0.0-Bv6NuW03r9D62JF72iBgOv" False) ((C1 (MetaCons "ConfettiYamlNotFound" PrefixI False) (U1 :: Type -> Type) :+: 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))))

data ApplyError a Source #

Constructors

VariantsMissing [a] 
VariantAlreadyExists [a] 
Instances
Foldable ApplyError Source # 
Instance details

Defined in Confetti

Methods

fold :: Monoid m => ApplyError m -> m #

foldMap :: Monoid m => (a -> m) -> ApplyError a -> m #

foldr :: (a -> b -> b) -> b -> ApplyError a -> b #

foldr' :: (a -> b -> b) -> b -> ApplyError a -> b #

foldl :: (b -> a -> b) -> b -> ApplyError a -> b #

foldl' :: (b -> a -> b) -> b -> ApplyError a -> b #

foldr1 :: (a -> a -> a) -> ApplyError a -> a #

foldl1 :: (a -> a -> a) -> ApplyError a -> a #

toList :: ApplyError a -> [a] #

null :: ApplyError a -> Bool #

length :: ApplyError a -> Int #

elem :: Eq a => a -> ApplyError a -> Bool #

maximum :: Ord a => ApplyError a -> a #

minimum :: Ord a => ApplyError a -> a #

sum :: Num a => ApplyError a -> a #

product :: Num a => ApplyError a -> a #

Show a => Show (ApplyError a) Source # 
Instance details

Defined in Confetti

data SearchPath Source #

Constructors

SearchPath 
Instances
Eq SearchPath Source # 
Instance details

Defined in Confetti

Show SearchPath Source # 
Instance details

Defined in Confetti

Generic SearchPath Source # 
Instance details

Defined in Confetti

Associated Types

type Rep SearchPath :: Type -> Type #

FromJSON SearchPath Source # 
Instance details

Defined in Confetti

type Rep SearchPath Source # 
Instance details

Defined in Confetti

type Rep SearchPath = D1 (MetaData "SearchPath" "Confetti" "confetti-1.0.0-Bv6NuW03r9D62JF72iBgOv" 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 Confetti

Generic ConfigGroup Source # 
Instance details

Defined in Confetti

Associated Types

type Rep ConfigGroup :: Type -> Type #

FromJSON ConfigGroup Source # 
Instance details

Defined in Confetti

type Rep ConfigGroup Source # 
Instance details

Defined in Confetti

data CommonConfigGroup Source #

Instances
Show CommonConfigGroup Source # 
Instance details

Defined in Confetti

Generic CommonConfigGroup Source # 
Instance details

Defined in Confetti

Associated Types

type Rep CommonConfigGroup :: Type -> Type #

FromJSON CommonConfigGroup Source # 
Instance details

Defined in Confetti

type Rep CommonConfigGroup Source # 
Instance details

Defined in Confetti

type Rep CommonConfigGroup = D1 (MetaData "CommonConfigGroup" "Confetti" "confetti-1.0.0-Bv6NuW03r9D62JF72iBgOv" 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 Confetti

Generic ParsedSpecFile Source # 
Instance details

Defined in Confetti

Associated Types

type Rep ParsedSpecFile :: Type -> Type #

FromJSON ParsedSpecFile Source # 
Instance details

Defined in Confetti

type Rep ParsedSpecFile Source # 
Instance details

Defined in Confetti

type Rep ParsedSpecFile = D1 (MetaData "ParsedSpecFile" "Confetti" "confetti-1.0.0-Bv6NuW03r9D62JF72iBgOv" 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))))