ghc-7.8.4: The GHC API
GHC's functionality can be useful for more things than just compiling Haskell programs. Important use cases are programs that analyse (and perhaps transform) Haskell code. Others include loading Haskell code dynamically in a GHCi-like manner. For this reason, a lot of GHC's functionality is made available through this package.
- Annotations
- AsmCodeGen
- Avail
- Bag
- BasicTypes
- BinIface
- Binary
- Bitmap
- BlockId
- BooleanFormula
- BreakArray
- BufWrite
- BuildTyCl
- ByteCodeAsm
- ByteCodeGen
- ByteCodeInstr
- ByteCodeItbls
- ByteCodeLink
- CLabel
- CPrim
- CSE
- CgUtils
- Check
- Class
- CmdLineParser
- Cmm
- CmmBuildInfoTables
- CmmCallConv
- CmmCommonBlockElim
- CmmContFlowOpt
- CmmExpr
- CmmInfo
- CmmLayoutStack
- CmmLex
- CmmLint
- CmmLive
- CmmMachOp
- CmmNode
- CmmOpt
- CmmParse
- CmmPipeline
- CmmProcPoint
- CmmRewriteAssignments
- CmmSink
- CmmType
- CmmUtils
- CoAxiom
- CodeGen
- CodeOutput
- Coercion
- ConLike
- Config
- Constants
- Convert
- CoreArity
- CoreFVs
- CoreLint
- CoreMonad
- CorePrep
- CoreSubst
- CoreSyn
- CoreTidy
- CoreToStg
- CoreUnfold
- CoreUtils
- CostCentre
- Coverage
- Ctype
- DataCon
- Debugger
- DebuggerUtils
- Demand
- Desugar
- Digraph
- DmdAnal
- DriverMkDepend
- DriverPhases
- DriverPipeline
- DsArrows
- DsBinds
- DsCCall
- DsExpr
- DsForeign
- DsGRHSs
- DsListComp
- DsMeta
- DsMonad
- DsUtils
- DynFlags
- DynamicLoading
- Encoding
- ErrUtils
- Exception
- ExternalCore
- ExtsCompat46
- FamInst
- FamInstEnv
- FastBool
- FastFunctions
- FastMutInt
- FastString
- FastTypes
- Finder
- Fingerprint
- FiniteMap
- FlagChecker
- FloatIn
- FloatOut
- ForeignCall
- FunDeps
- GHC
- GhcMake
- GhcMonad
- GhcPlugins
- GraphBase
- GraphColor
- GraphOps
- GraphPpr
- HaddockUtils
- HeaderInfo
- Hooks
- Hoopl
- HsBinds
- HsDecls
- HsDoc
- HsExpr
- HsImpExp
- HsLit
- HsPat
- HsSyn
- HsTypes
- HsUtils
- HscMain
- HscStats
- HscTypes
- IOEnv
- Id
- IdInfo
- IfaceEnv
- IfaceSyn
- IfaceType
- Inst
- InstEnv
- Instruction
- InteractiveEval
- InteractiveEvalTypes
- Kind
- LexCore
- Lexer
- LibFFI
- LiberateCase
- Linker
- ListSetOps
- Literal
- Llvm
- LlvmCodeGen
- LlvmMangler
- LoadIface
- Match
- MatchCon
- MatchLit
- Maybes
- MkCore
- MkExternalCore
- MkGraph
- MkId
- MkIface
- Module
- MonadUtils
- NCGMonad
- Name
- NameEnv
- NameSet
- ObjLink
- OccName
- OccurAnal
- OptCoercion
- OrdList
- Outputable
- PIC
- PPC
- PackageConfig
- Packages
- Pair
- Panic
- Parser
- ParserCore
- ParserCoreUtils
- PatSyn
- PipelineMonad
- Platform
- PlatformConstants
- PprBase
- PprC
- PprCmm
- PprCmmDecl
- PprCmmExpr
- PprCore
- PprExternalCore
- PprTyThing
- PrelInfo
- PrelNames
- PrelRules
- Pretty
- PrimOp
- ProfInit
- RdrHsSyn
- RdrName
- Reg
- RegAlloc
- Graph
- Linear
- RegAlloc.Liveness
- RegClass
- RnBinds
- RnEnv
- RnExpr
- RnHsDoc
- RnNames
- RnPat
- RnSource
- RnSplice
- RnTypes
- RtClosureInspect
- Rules
- SAT
- SCCfinal
- SMRep
- SPARC
- Serialized
- SetLevels
- SimplCore
- SimplEnv
- SimplMonad
- SimplStg
- SimplUtils
- Simplify
- Size
- SpecConstr
- Specialise
- SrcLoc
- State
- StaticFlags
- StgCmm
- StgCmmArgRep
- StgCmmBind
- StgCmmClosure
- StgCmmCon
- StgCmmEnv
- StgCmmExpr
- StgCmmExtCode
- StgCmmForeign
- StgCmmHeap
- StgCmmHpc
- StgCmmLayout
- StgCmmMonad
- StgCmmPrim
- StgCmmProf
- StgCmmTicky
- StgCmmUtils
- StgLint
- StgStats
- StgSyn
- Stream
- StringBuffer
- SysTools
- TargetReg
- TcAnnotations
- TcArrows
- TcBinds
- TcCanonical
- TcClassDcl
- TcDefaults
- TcDeriv
- TcEnv
- TcErrors
- TcEvidence
- TcExpr
- TcForeign
- TcGenDeriv
- TcGenGenerics
- TcHsSyn
- TcHsType
- TcIface
- TcInstDcls
- TcInteract
- TcMType
- TcMatches
- TcPat
- TcPatSyn
- TcRnDriver
- TcRnMonad
- TcRnTypes
- TcRules
- TcSMonad
- TcSimplify
- TcSplice
- TcTyClsDecls
- TcTyDecls
- TcType
- TcTypeNats
- TcUnify
- TcValidity
- TidyPgm
- TrieMap
- TyCon
- Type
- TysPrim
- TysWiredIn
- UnariseStg
- Unify
- UniqFM
- UniqSet
- UniqSupply
- Unique
- Util
- Var
- VarEnv
- VarSet
- Vectorise
- WorkWrap
- WwLib
- X86