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

Safe HaskellNone
LanguageHaskell2010

B9.Content.StringTemplate

Description

Utility functions based on Template to offer $var variable expansion in string throughout a B9 artifact.

Synopsis

Documentation

substFile :: MonadIO m => [(String, String)] -> FilePath -> FilePath -> m () Source #

data SourceFile Source #

A wrapper around a file path and a flag indicating if template variable expansion should be performed when reading the file contents.

Instances

Eq SourceFile Source # 
Data SourceFile Source # 

Methods

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

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

toConstr :: SourceFile -> Constr #

dataTypeOf :: SourceFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Read SourceFile Source # 
Show SourceFile Source # 
Generic SourceFile Source # 

Associated Types

type Rep SourceFile :: * -> * #

Arbitrary SourceFile Source # 
Hashable SourceFile Source # 
Binary SourceFile Source # 
NFData SourceFile Source # 

Methods

rnf :: SourceFile -> () #

type Rep SourceFile Source # 

data SourceFileConversion Source #

Instances

Eq SourceFileConversion Source # 
Data SourceFileConversion Source # 

Methods

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

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

toConstr :: SourceFileConversion -> Constr #

dataTypeOf :: SourceFileConversion -> DataType #

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

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

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

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

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

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

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

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

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

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

Read SourceFileConversion Source # 
Show SourceFileConversion Source # 
Generic SourceFileConversion Source # 
Hashable SourceFileConversion Source # 
Binary SourceFileConversion Source # 
NFData SourceFileConversion Source # 

Methods

rnf :: SourceFileConversion -> () #

type Rep SourceFileConversion Source # 
type Rep SourceFileConversion = D1 (MetaData "SourceFileConversion" "B9.Content.StringTemplate" "b9-0.5.31-3Csq7TYtz8i6MtZry0GfkU" False) ((:+:) (C1 (MetaCons "NoConversion" PrefixI False) U1) (C1 (MetaCons "ExpandVariables" PrefixI False) U1))

newtype Environment Source #

Constructors

Environment [(String, String)] 

Instances

Eq Environment Source # 
Data Environment Source # 

Methods

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

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

toConstr :: Environment -> Constr #

dataTypeOf :: Environment -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Environment Source # 
Show Environment Source # 
Hashable Environment Source # 
Binary Environment Source # 
NFData Environment Source # 

Methods

rnf :: Environment -> () #