| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Lib
Documentation
data ParseError a Source #
Constructors
| ConfettiYamlNotFound | |
| GroupNotFound a | |
| ConfettiYamlInvalid a | |
| DuplicateNameError a |
Instances
| Show a => Show (ParseError a) Source # | |
Defined in Lib Methods showsPrec :: Int -> ParseError a -> ShowS # show :: ParseError a -> String # showList :: [ParseError a] -> ShowS # | |
| Generic (ParseError a) Source # | |
| type Rep (ParseError a) Source # | |
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 # | |
Defined in Lib Methods showsPrec :: Int -> ApplyError a -> ShowS # show :: ApplyError a -> String # showList :: [ApplyError a] -> ShowS # | |
type ConfigVariant = String Source #
type ConfigVariantFileName = String Source #
type ConfigVariantPrefix = Maybe String Source #
type ConfigTarget = String Source #
data SearchPath Source #
Instances
| Eq SearchPath Source # | |
Defined in Lib | |
| Show SearchPath Source # | |
Defined in Lib Methods showsPrec :: Int -> SearchPath -> ShowS # show :: SearchPath -> String # showList :: [SearchPath] -> ShowS # | |
| Generic SearchPath Source # | |
| FromJSON SearchPath Source # | |
Defined in Lib | |
| type Rep SearchPath Source # | |
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 VariantSearch Source #
Constructors
| VariantSearch | |
Fields | |
Instances
| Show VariantSearch Source # | |
Defined in Lib Methods showsPrec :: Int -> VariantSearch -> ShowS # show :: VariantSearch -> String # showList :: [VariantSearch] -> ShowS # | |
| Generic VariantSearch Source # | |
| type Rep VariantSearch Source # | |
Defined in Lib type Rep VariantSearch = D1 (MetaData "VariantSearch" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) (C1 (MetaCons "VariantSearch" PrefixI True) ((S1 (MetaSel (Just "searchDirectory") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 FilePath) :*: S1 (MetaSel (Just "fileName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ConfigVariantFileName)) :*: (S1 (MetaSel (Just "recursiveSearch") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool) :*: (S1 (MetaSel (Just "result") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ConfigVariant)) :*: S1 (MetaSel (Just "linkToCreate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ConfigTarget))))) | |
data ConfigGroup Source #
Constructors
| ConfigGroup | |
Fields
| |
Instances
| Show ConfigGroup Source # | |
Defined in Lib Methods showsPrec :: Int -> ConfigGroup -> ShowS # show :: ConfigGroup -> String # showList :: [ConfigGroup] -> ShowS # | |
| Generic ConfigGroup Source # | |
| FromJSON ConfigGroup Source # | |
Defined in Lib | |
| type Rep ConfigGroup Source # | |
Defined in Lib type Rep ConfigGroup = D1 (MetaData "ConfigGroup" "Lib" "confetti-0.3.1-1bYcoUb204dJnrqaoRZTKx" False) (C1 (MetaCons "ConfigGroup" PrefixI True) (S1 (MetaSel (Just "name") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: (S1 (MetaSel (Just "targets") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FilePath]) :*: S1 (MetaSel (Just "searchPaths") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SearchPath]))))) | |
data CommonConfigGroup Source #
Constructors
| CommonConfigGroup | |
Fields
| |
Instances
data ParsedSpecFile Source #
Constructors
| ParsedSpecFile | |
Fields | |
Instances
| Show ParsedSpecFile Source # | |
Defined in Lib Methods showsPrec :: Int -> ParsedSpecFile -> ShowS # show :: ParsedSpecFile -> String # showList :: [ParsedSpecFile] -> ShowS # | |
| Generic ParsedSpecFile Source # | |
Defined in Lib Associated Types type Rep ParsedSpecFile :: * -> * # Methods from :: ParsedSpecFile -> Rep ParsedSpecFile x # to :: Rep ParsedSpecFile x -> ParsedSpecFile # | |
| FromJSON ParsedSpecFile Source # | |
Defined in Lib Methods parseJSON :: Value -> Parser ParsedSpecFile # parseJSONList :: Value -> Parser [ParsedSpecFile] # | |
| type Rep ParsedSpecFile Source # | |
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)))) | |
data ConfigSpec Source #
Constructors
| ConfigSpec | |
Fields | |
parseGroup :: FilePath -> Text -> IO (Either (ParseError Text) ConfigGroup) Source #
defaultSearchPaths :: [ConfigTarget] -> Maybe [SearchPath] -> IO [SearchPath] Source #
findGroup :: ParsedSpecFile -> Text -> IO (Either (ParseError Text) ConfigGroup) Source #
backUpIfNonSymLink :: FilePath -> IO () Source #
createBackup :: FilePath -> IO () Source #
removeIfExists :: FilePath -> IO () Source #
filterMissingVariants :: [ConfigVariant] -> IO [FilePath] Source #
linkTargets :: [VariantSearch] -> IO () Source #
searchVariants :: ConfigVariantPrefix -> [ConfigTarget] -> [SearchPath] -> IO [VariantSearch] Source #
applySpec :: ConfigSpec -> IO (Maybe (ApplyError FilePath)) Source #
printSuccess :: String -> IO () Source #