b9-0.5.35: A tool and library for building virtual machine images.

Safe HaskellNone
LanguageHaskell2010

B9.ConfigUtils

Description

Extensions to ConfigFile and utility functions for dealing with configuration in general and reading/writing files.

Synopsis

Documentation

allOn :: (a -> Maybe Bool) -> a -> a -> Maybe Bool Source #

lastOn :: (a -> Maybe b) -> a -> a -> Maybe b Source #

data SystemPath Source #

Instances

Eq SystemPath Source # 
Data SystemPath Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SystemPath -> c SystemPath #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SystemPath #

toConstr :: SystemPath -> Constr #

dataTypeOf :: SystemPath -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c SystemPath) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SystemPath) #

gmapT :: (forall b. Data b => b -> b) -> SystemPath -> SystemPath #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SystemPath -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SystemPath -> r #

gmapQ :: (forall d. Data d => d -> u) -> SystemPath -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SystemPath -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SystemPath -> m SystemPath #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemPath -> m SystemPath #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemPath -> m SystemPath #

Read SystemPath Source # 
Show SystemPath Source # 

tell :: (MonadIO m, Show a) => FilePath -> a -> m () Source #

consult :: (MonadIO m, Read a) => FilePath -> m a Source #

getDirectoryFiles :: MonadIO m => FilePath -> m [FilePath] Source #

Get all files from dir that is get ONLY files not directories

maybeConsult :: (MonadIO m, Read a) => Maybe FilePath -> a -> m a Source #