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

Safe HaskellNone
LanguageHaskell2010

B9.Content.Generator

Description

The basic data structure that ties together syntax trees making them composable and addressable in B9 artifacts.

Documentation

data Content Source #

Instances

Eq Content Source # 

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Data Content Source # 

Methods

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

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

toConstr :: Content -> Constr #

dataTypeOf :: Content -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Content Source # 
Show Content Source # 
Generic Content Source # 

Associated Types

type Rep Content :: * -> * #

Methods

from :: Content -> Rep Content x #

to :: Rep Content x -> Content #

Arbitrary Content Source # 
Hashable Content Source # 

Methods

hashWithSalt :: Int -> Content -> Int #

hash :: Content -> Int #

Binary Content Source # 

Methods

put :: Content -> Put #

get :: Get Content #

putList :: [Content] -> Put #

NFData Content Source # 

Methods

rnf :: Content -> () #

CanRender Content Source # 
type Rep Content Source #