ghc-7.8.20140130: The GHC API

Safe HaskellNone
LanguageHaskell98

StgSyn

Synopsis

Documentation

data GenStgArg occSource

Constructors

StgVarArg occ 
StgLitArg Literal 

Instances

data GenStgBinding bndr occSource

Constructors

StgNonRec bndr (GenStgRhs bndr occ) 
StgRec [(bndr, GenStgRhs bndr occ)] 

Instances

(OutputableBndr bndr, Outputable bdee, Ord bdee) => Outputable (GenStgBinding bndr bdee) 

data GenStgExpr bndr occSource

Constructors

StgApp occ [GenStgArg occ] 
StgLit Literal 
StgConApp DataCon [GenStgArg occ] 
StgOpApp StgOp [GenStgArg occ] Type 
StgLam [bndr] StgExpr 
StgCase (GenStgExpr bndr occ) (GenStgLiveVars occ) (GenStgLiveVars occ) bndr SRT AltType [GenStgAlt bndr occ] 
StgLet (GenStgBinding bndr occ) (GenStgExpr bndr occ) 
StgLetNoEscape (GenStgLiveVars occ) (GenStgLiveVars occ) (GenStgBinding bndr occ) (GenStgExpr bndr occ) 
StgSCC CostCentre !Bool !Bool (GenStgExpr bndr occ) 
StgTick Module Int (GenStgExpr bndr occ) 

Instances

(OutputableBndr bndr, Outputable bdee, Ord bdee) => Outputable (GenStgExpr bndr bdee) 

data GenStgRhs bndr occSource

Instances

(OutputableBndr bndr, Outputable bdee, Ord bdee) => Outputable (GenStgRhs bndr bdee) 

type GenStgAlt bndr occ = (AltCon, [bndr], [Bool], GenStgExpr bndr occ)Source

data SRTSource

Constructors

NoSRT 
SRTEntries IdSet 
SRT !Int !Int !Bitmap 

isDllConApp :: DynFlags -> Module -> DataCon -> [StgArg] -> BoolSource

Does this constructor application refer to anything in a different *Windows* DLL? If so, we can't allocate it statically

stgArgType :: StgArg -> TypeSource

Type of an StgArg

Very half baked becase we have lost the type arguments.