| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Cmm
Contents
Synopsis
- type CmmProgram = [CmmGroup]
- type CmmGroup = GenCmmGroup CmmStatics CmmTopInfo CmmGraph
- type GenCmmGroup d h g = [GenCmmDecl d h g]
- type CmmDecl = GenCmmDecl CmmStatics CmmTopInfo CmmGraph
- data GenCmmDecl d h g
- type CmmGraph = GenCmmGraph CmmNode
- data GenCmmGraph n = CmmGraph {}
- type CmmBlock = Block CmmNode C C
- type RawCmmDecl = GenCmmDecl CmmStatics (LabelMap CmmStatics) CmmGraph
- type RawCmmGroup = GenCmmGroup CmmStatics (LabelMap CmmStatics) CmmGraph
- data Section = Section SectionType CLabel
- data SectionType
- data CmmStatics = Statics CLabel [CmmStatic]
- data CmmStatic
- = CmmStaticLit CmmLit
- | CmmUninitialised Int
- | CmmString [Word8]
- isSecConstant :: Section -> Bool
- data GenBasicBlock i = BasicBlock BlockId [i]
- blockId :: GenBasicBlock i -> BlockId
- newtype ListGraph i = ListGraph [GenBasicBlock i]
- pprBBlock :: Outputable stmt => GenBasicBlock stmt -> SDoc
- data CmmTopInfo = TopInfo {}
- data CmmStackInfo = StackInfo {}
- data CmmInfoTable = CmmInfoTable {}
- topInfoTable :: GenCmmDecl a CmmTopInfo (GenCmmGraph n) -> Maybe CmmInfoTable
- data ClosureTypeInfo
- = Constr ConTagZ ConstrDescription
- | Fun FunArity ArgDescr
- | Thunk
- | ThunkSelector SelectorOffset
- | BlackHole
- | IndStatic
- data ProfilingInfo
- = NoProfilingInfo
- | ProfilingInfo [Word8] [Word8]
- type ConstrDescription = [Word8]
- module CmmNode
- module CmmExpr
Cmm top-level datatypes
type CmmProgram = [CmmGroup] Source #
type GenCmmGroup d h g = [GenCmmDecl d h g] Source #
type CmmDecl = GenCmmDecl CmmStatics CmmTopInfo CmmGraph Source #
data GenCmmDecl d h g Source #
A top-level chunk, abstracted over the type of the contents of the basic blocks (Cmm or instructions are the likely instantiations).
Instances
Instance details
Defined in PprCmmDecl
type CmmGraph = GenCmmGraph CmmNode Source #
data GenCmmGraph n Source #
type RawCmmDecl = GenCmmDecl CmmStatics (LabelMap CmmStatics) CmmGraph Source #
data SectionType Source #
Constructors
Instances
Instance details
Defined in Cmm
Methods
showsPrec :: Int -> SectionType -> ShowS #
show :: SectionType -> String #
showList :: [SectionType] -> ShowS #
data CmmStatics Source #
Instances
Instance details
Defined in PprCmmDecl
isSecConstant :: Section -> Bool Source #
Should a data in this section be considered constant
Blocks containing lists
blockId :: GenBasicBlock i -> BlockId Source #
The branch block id is that of the first block in the branch, which is that branch's entry point
Constructors
pprBBlock :: Outputable stmt => GenBasicBlock stmt -> SDoc Source #
Info Tables
data CmmTopInfo Source #
Instances
data CmmStackInfo Source #
Instances
data CmmInfoTable Source #
Info table as a haskell data type
Constructors
Instances
Instance details
Defined in PprCmmDecl
topInfoTable :: GenCmmDecl a CmmTopInfo (GenCmmGraph n) -> Maybe CmmInfoTable Source #
data ProfilingInfo Source #
type ConstrDescription = [Word8] Source #
Statements, expressions and types
module CmmNode
module CmmExpr