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

Safe HaskellNone
LanguageHaskell2010

B9.Vm

Description

Definition of VmScript an artifact encapsulating several virtual machines disk images that can be mounted in an execution environment like B9.LibVirtLXC. A VmScript is embedded by in an ArtifactGenerator.

Synopsis

Documentation

data VmScript Source #

Describe a virtual machine, i.e. a set up disk images to create and a shell script to put things together.

Instances

Eq VmScript Source # 
Data VmScript Source # 

Methods

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

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

toConstr :: VmScript -> Constr #

dataTypeOf :: VmScript -> DataType #

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

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

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

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

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

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

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

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

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

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

Read VmScript Source # 
Show VmScript Source # 
Generic VmScript Source # 

Associated Types

type Rep VmScript :: * -> * #

Methods

from :: VmScript -> Rep VmScript x #

to :: Rep VmScript x -> VmScript #

Hashable VmScript Source # 

Methods

hashWithSalt :: Int -> VmScript -> Int #

hash :: VmScript -> Int #

Binary VmScript Source # 

Methods

put :: VmScript -> Put #

get :: Get VmScript #

putList :: [VmScript] -> Put #

NFData VmScript Source # 

Methods

rnf :: VmScript -> () #

type Rep VmScript Source #