ghc-6.12.2: The GHC APISource codeContentsIndex
SimplUtils
Documentation
mkLam :: SimplEnv -> [OutBndr] -> OutExpr -> SimplM OutExprSource
mkCase :: OutExpr -> OutId -> [OutAlt] -> SimplM OutExprSource
prepareAlts :: SimplEnv -> OutExpr -> OutId -> [InAlt] -> SimplM ([AltCon], [InAlt])Source
bindCaseBndr :: Id -> CoreExpr -> CoreExpr -> CoreExprSource
preInlineUnconditionally :: SimplEnv -> TopLevelFlag -> InId -> InExpr -> BoolSource
postInlineUnconditionally :: SimplEnv -> TopLevelFlag -> InId -> OccInfo -> OutExpr -> Unfolding -> BoolSource
activeInline :: SimplEnv -> OutId -> BoolSource
activeRule :: DynFlags -> SimplEnv -> Maybe (Activation -> Bool)Source
inlineMode :: SimplifierModeSource
data SimplCont Source
Constructors
Stop CallCtxt
CoerceIt OutCoercion SimplCont
ApplyTo DupFlag InExpr SimplEnv SimplCont
Select DupFlag InId [InAlt] SimplEnv SimplCont
StrictBind InId [InBndr] InExpr SimplEnv SimplCont
StrictArg OutExpr CallCtxt ArgInfo SimplCont
show/hide Instances
data DupFlag Source
Constructors
OkToDup
NoDup
show/hide Instances
data ArgInfo Source
Constructors
ArgInfo
ai_rules :: Bool
ai_strs :: [Bool]
ai_discs :: [Int]
contIsDupable :: SimplCont -> BoolSource
contResultType :: SimplEnv -> OutType -> SimplCont -> OutTypeSource
contIsTrivial :: SimplCont -> BoolSource
contArgs :: SimplCont -> ([OutExpr], SimplCont)Source
dropArgs :: Int -> SimplCont -> SimplContSource
countValArgs :: SimplCont -> IntSource
countArgs :: SimplCont -> IntSource
splitInlineCont :: SimplCont -> Maybe (SimplCont, SimplCont)Source
mkBoringStop :: SimplContSource
mkLazyArgStop :: CallCtxt -> SimplContSource
contIsRhsOrArg :: SimplCont -> BoolSource
interestingCallContext :: SimplCont -> CallCtxtSource
interestingArgContext :: Id -> SimplCont -> BoolSource
interestingArg :: CoreExpr -> ArgSummarySource
mkArgInfo :: Id -> Int -> SimplCont -> ArgInfoSource
abstractFloats :: [OutTyVar] -> SimplEnv -> OutExpr -> SimplM ([OutBind], OutExpr)Source
Produced by Haddock version 2.6.1