ghc-6.12.2: The GHC APISource codeContentsIndex
CgUtils
Documentation
addIdReps :: [Id] -> [(CgRep, Id)]Source
cgLit :: Literal -> FCode CmmLitSource
emitDataLits :: CLabel -> [CmmLit] -> CodeSource
mkDataLits :: CLabel -> [CmmLit] -> GenCmmTop CmmStatic info graphSource
emitRODataLits :: String -> CLabel -> [CmmLit] -> CodeSource
mkRODataLits :: CLabel -> [CmmLit] -> GenCmmTop CmmStatic info graphSource
emitIf :: CmmExpr -> Code -> CodeSource
emitIfThenElse :: CmmExpr -> Code -> Code -> CodeSource
emitRtsCall :: LitString -> [CmmHinted CmmExpr] -> Bool -> CodeSource
emitRtsCallWithVols :: LitString -> [CmmHinted CmmExpr] -> [GlobalReg] -> Bool -> CodeSource
emitRtsCallWithResult :: LocalReg -> ForeignHint -> LitString -> [CmmHinted CmmExpr] -> Bool -> CodeSource
assignTemp :: CmmExpr -> FCode CmmExprSource
newTemp :: CmmType -> FCode LocalRegSource
emitSimultaneously :: CmmStmts -> CodeSource
emitSwitch :: CmmExpr -> [(ConTagZ, CgStmts)] -> Maybe CgStmts -> ConTagZ -> ConTagZ -> CodeSource
emitLitSwitch :: CmmExpr -> [(Literal, CgStmts)] -> CgStmts -> CodeSource
tagToClosure :: TyCon -> CmmExpr -> CmmExprSource
callerSaveVolatileRegs :: Maybe [GlobalReg] -> ([CmmStmt], [CmmStmt])Source
get_GlobalReg_addr :: GlobalReg -> CmmExprSource
cmmAndWord :: CmmExpr -> CmmExpr -> CmmExprSource
cmmOrWord :: CmmExpr -> CmmExpr -> CmmExprSource
cmmNegate :: CmmExpr -> CmmExprSource
cmmEqWord :: CmmExpr -> CmmExpr -> CmmExprSource
cmmNeWord :: CmmExpr -> CmmExpr -> CmmExprSource
cmmUGtWord :: CmmExpr -> CmmExpr -> CmmExprSource
cmmOffsetExprW :: CmmExpr -> CmmExpr -> CmmExprSource
cmmOffsetExprB :: CmmExpr -> CmmExpr -> CmmExprSource
cmmRegOffW :: CmmReg -> WordOff -> CmmExprSource
cmmRegOffB :: CmmReg -> ByteOff -> CmmExprSource
cmmLabelOffW :: CLabel -> WordOff -> CmmLitSource
cmmLabelOffB :: CLabel -> ByteOff -> CmmLitSource
cmmOffsetW :: CmmExpr -> WordOff -> CmmExprSource
cmmOffsetB :: CmmExpr -> ByteOff -> CmmExprSource
cmmOffsetLitW :: CmmLit -> WordOff -> CmmLitSource
cmmOffsetLitB :: CmmLit -> ByteOff -> CmmLitSource
cmmLoadIndexW :: CmmExpr -> Int -> CmmType -> CmmExprSource
cmmConstrTag :: CmmExpr -> CmmExprSource
cmmConstrTag1 :: CmmExpr -> CmmExprSource
tagForCon :: DataCon -> ConTagZSource
tagCons :: DataCon -> CmmExpr -> CmmExprSource
isSmallFamily :: Int -> BoolSource
cmmUntag :: CmmExpr -> CmmExprSource
cmmIsTagged :: CmmExpr -> CmmExprSource
cmmGetTag :: CmmExpr -> CmmExprSource
addToMem :: Width -> CmmExpr -> Int -> CmmStmtSource
addToMemE :: Width -> CmmExpr -> CmmExpr -> CmmStmtSource
mkWordCLit :: StgWord -> CmmLitSource
mkStringCLit :: String -> FCode CmmLitSource
mkByteStringCLit :: [Word8] -> FCode CmmLitSource
packHalfWordsCLit :: (Integral a, Integral b) => a -> b -> CmmLitSource
blankWord :: CmmStaticSource
getSRTInfo :: FCode C_SRTSource
clHasCafRefs :: ClosureInfo -> CafInfoSource
Produced by Haddock version 2.6.1