ghc-lib: The GHC API, decoupled from GHC versions

[ bsd3, development, library ] [ Propose Tags ] [ Report a vulnerability ]

A package equivalent to the ghc package, but which can be loaded on many compiler versions.

Modules

[Last Documentation]

  • GHC
    • GHC.BaseDir
    • Builtin
      • GHC.Builtin.Names
        • GHC.Builtin.Names.TH
      • GHC.Builtin.PrimOps
        • GHC.Builtin.PrimOps.Casts
        • GHC.Builtin.PrimOps.Ids
      • GHC.Builtin.Types
        • GHC.Builtin.Types.Literals
        • GHC.Builtin.Types.Prim
      • GHC.Builtin.Uniques
      • GHC.Builtin.Utils
    • ByteCode
      • GHC.ByteCode.Asm
      • GHC.ByteCode.InfoTable
      • GHC.ByteCode.Instr
      • GHC.ByteCode.Linker
      • GHC.ByteCode.Types
    • GHC.Cmm
      • GHC.Cmm.BlockId
      • GHC.Cmm.CLabel
      • GHC.Cmm.CallConv
      • GHC.Cmm.CommonBlockElim
      • GHC.Cmm.Config
      • GHC.Cmm.ContFlowOpt
      • GHC.Cmm.Dataflow
        • GHC.Cmm.Dataflow.Block
        • GHC.Cmm.Dataflow.Graph
        • GHC.Cmm.Dataflow.Label
      • GHC.Cmm.DebugBlock
      • GHC.Cmm.Dominators
      • GHC.Cmm.Expr
      • GHC.Cmm.GenericOpt
      • GHC.Cmm.Graph
      • GHC.Cmm.Info
        • GHC.Cmm.Info.Build
      • GHC.Cmm.InitFini
      • GHC.Cmm.LRegSet
      • GHC.Cmm.LayoutStack
      • GHC.Cmm.Lexer
      • GHC.Cmm.Lint
      • GHC.Cmm.Liveness
      • GHC.Cmm.MachOp
      • GHC.Cmm.Node
      • GHC.Cmm.Opt
      • GHC.Cmm.Parser
        • GHC.Cmm.Parser.Config
        • GHC.Cmm.Parser.Monad
      • GHC.Cmm.Pipeline
      • GHC.Cmm.ProcPoint
      • GHC.Cmm.Reducibility
      • GHC.Cmm.Reg
      • GHC.Cmm.Sink
      • GHC.Cmm.Switch
        • GHC.Cmm.Switch.Implement
      • GHC.Cmm.ThreadSanitizer
      • GHC.Cmm.Type
      • GHC.Cmm.UniqueRenamer
      • GHC.Cmm.Utils
    • GHC.CmmToAsm
      • GHC.CmmToAsm.AArch64
        • GHC.CmmToAsm.AArch64.CodeGen
        • GHC.CmmToAsm.AArch64.Cond
        • GHC.CmmToAsm.AArch64.Instr
        • GHC.CmmToAsm.AArch64.Ppr
        • GHC.CmmToAsm.AArch64.RegInfo
        • GHC.CmmToAsm.AArch64.Regs
      • GHC.CmmToAsm.BlockLayout
      • GHC.CmmToAsm.CFG
        • GHC.CmmToAsm.CFG.Dominators
        • GHC.CmmToAsm.CFG.Weight
      • GHC.CmmToAsm.CPrim
      • GHC.CmmToAsm.Config
      • GHC.CmmToAsm.Dwarf
        • GHC.CmmToAsm.Dwarf.Constants
        • GHC.CmmToAsm.Dwarf.Types
      • GHC.CmmToAsm.Format
      • GHC.CmmToAsm.Instr
      • GHC.CmmToAsm.Monad
      • GHC.CmmToAsm.PIC
      • GHC.CmmToAsm.PPC
        • GHC.CmmToAsm.PPC.CodeGen
        • GHC.CmmToAsm.PPC.Cond
        • GHC.CmmToAsm.PPC.Instr
        • GHC.CmmToAsm.PPC.Ppr
        • GHC.CmmToAsm.PPC.RegInfo
        • GHC.CmmToAsm.PPC.Regs
      • GHC.CmmToAsm.Ppr
      • GHC.CmmToAsm.RV64
        • GHC.CmmToAsm.RV64.CodeGen
        • GHC.CmmToAsm.RV64.Cond
        • GHC.CmmToAsm.RV64.Instr
        • GHC.CmmToAsm.RV64.Ppr
        • GHC.CmmToAsm.RV64.RegInfo
        • GHC.CmmToAsm.RV64.Regs
      • Reg
        • GHC.CmmToAsm.Reg.Graph
          • GHC.CmmToAsm.Reg.Graph.Spill
          • GHC.CmmToAsm.Reg.Graph.SpillClean
          • GHC.CmmToAsm.Reg.Graph.SpillCost
          • GHC.CmmToAsm.Reg.Graph.Stats
          • GHC.CmmToAsm.Reg.Graph.TrivColorable
        • GHC.CmmToAsm.Reg.Linear
          • GHC.CmmToAsm.Reg.Linear.AArch64
          • GHC.CmmToAsm.Reg.Linear.Base
          • GHC.CmmToAsm.Reg.Linear.FreeRegs
          • GHC.CmmToAsm.Reg.Linear.JoinToTargets
          • GHC.CmmToAsm.Reg.Linear.PPC
          • GHC.CmmToAsm.Reg.Linear.RV64
          • GHC.CmmToAsm.Reg.Linear.StackMap
          • GHC.CmmToAsm.Reg.Linear.State
          • GHC.CmmToAsm.Reg.Linear.Stats
          • GHC.CmmToAsm.Reg.Linear.X86
          • GHC.CmmToAsm.Reg.Linear.X86_64
        • GHC.CmmToAsm.Reg.Liveness
        • GHC.CmmToAsm.Reg.Target
        • GHC.CmmToAsm.Reg.Utils
      • GHC.CmmToAsm.Types
      • GHC.CmmToAsm.Utils
      • GHC.CmmToAsm.Wasm
        • GHC.CmmToAsm.Wasm.Asm
        • GHC.CmmToAsm.Wasm.FromCmm
        • GHC.CmmToAsm.Wasm.Types
        • GHC.CmmToAsm.Wasm.Utils
      • GHC.CmmToAsm.X86
        • GHC.CmmToAsm.X86.CodeGen
        • GHC.CmmToAsm.X86.Cond
        • GHC.CmmToAsm.X86.Instr
        • GHC.CmmToAsm.X86.Ppr
        • GHC.CmmToAsm.X86.RegInfo
        • GHC.CmmToAsm.X86.Regs
    • GHC.CmmToC
    • GHC.CmmToLlvm
      • GHC.CmmToLlvm.Base
      • GHC.CmmToLlvm.CodeGen
      • GHC.CmmToLlvm.Config
      • GHC.CmmToLlvm.Data
      • GHC.CmmToLlvm.Mangler
      • GHC.CmmToLlvm.Ppr
      • GHC.CmmToLlvm.Regs
      • GHC.CmmToLlvm.Version
        • GHC.CmmToLlvm.Version.Bounds
        • GHC.CmmToLlvm.Version.Type
    • GHC.Core
      • GHC.Core.Class
      • GHC.Core.Coercion
        • GHC.Core.Coercion.Axiom
        • GHC.Core.Coercion.Opt
      • GHC.Core.ConLike
      • GHC.Core.DataCon
      • GHC.Core.FVs
      • GHC.Core.FamInstEnv
      • GHC.Core.InstEnv
      • GHC.Core.LateCC
        • GHC.Core.LateCC.OverloadedCalls
        • GHC.Core.LateCC.TopLevelBinds
        • GHC.Core.LateCC.Types
        • GHC.Core.LateCC.Utils
      • GHC.Core.Lint
        • GHC.Core.Lint.Interactive
      • GHC.Core.Make
      • Map
        • GHC.Core.Map.Expr
        • GHC.Core.Map.Type
      • GHC.Core.Multiplicity
      • Opt
        • GHC.Core.Opt.Arity
        • GHC.Core.Opt.CSE
        • GHC.Core.Opt.CallArity
        • GHC.Core.Opt.CallerCC
          • GHC.Core.Opt.CallerCC.Types
        • GHC.Core.Opt.ConstantFold
        • GHC.Core.Opt.CprAnal
        • GHC.Core.Opt.DmdAnal
        • GHC.Core.Opt.Exitify
        • GHC.Core.Opt.FloatIn
        • GHC.Core.Opt.FloatOut
        • GHC.Core.Opt.LiberateCase
        • GHC.Core.Opt.Monad
        • GHC.Core.Opt.OccurAnal
        • GHC.Core.Opt.Pipeline
          • GHC.Core.Opt.Pipeline.Types
        • GHC.Core.Opt.SetLevels
        • GHC.Core.Opt.Simplify
          • GHC.Core.Opt.Simplify.Env
          • GHC.Core.Opt.Simplify.Inline
          • GHC.Core.Opt.Simplify.Iteration
          • GHC.Core.Opt.Simplify.Monad
          • GHC.Core.Opt.Simplify.Utils
        • GHC.Core.Opt.SpecConstr
        • GHC.Core.Opt.Specialise
        • GHC.Core.Opt.StaticArgs
        • GHC.Core.Opt.Stats
        • GHC.Core.Opt.WorkWrap
          • GHC.Core.Opt.WorkWrap.Utils
      • GHC.Core.PatSyn
      • GHC.Core.Ppr
      • GHC.Core.Predicate
      • GHC.Core.Reduction
      • GHC.Core.RoughMap
      • GHC.Core.Rules
        • GHC.Core.Rules.Config
      • GHC.Core.Seq
      • GHC.Core.SimpleOpt
      • GHC.Core.Stats
      • GHC.Core.Subst
      • GHC.Core.Tidy
      • TyCo
        • GHC.Core.TyCo.Compare
        • GHC.Core.TyCo.FVs
        • GHC.Core.TyCo.Ppr
        • GHC.Core.TyCo.Rep
        • GHC.Core.TyCo.Subst
        • GHC.Core.TyCo.Tidy
      • GHC.Core.TyCon
        • GHC.Core.TyCon.Env
        • GHC.Core.TyCon.RecWalk
        • GHC.Core.TyCon.Set
      • GHC.Core.Type
      • GHC.Core.Unfold
        • GHC.Core.Unfold.Make
      • GHC.Core.Unify
      • GHC.Core.UsageEnv
      • GHC.Core.Utils
    • GHC.CoreToIface
    • GHC.CoreToStg
      • GHC.CoreToStg.Prep
    • Data
      • GHC.Data.Bag
      • GHC.Data.Bitmap
      • GHC.Data.Bool
      • GHC.Data.BooleanFormula
      • GHC.Data.EnumSet
      • GHC.Data.FastMutInt
      • GHC.Data.FastString
        • GHC.Data.FastString.Env
      • GHC.Data.FiniteMap
      • GHC.Data.FlatBag
      • Graph
        • GHC.Data.Graph.Base
        • GHC.Data.Graph.Collapse
        • GHC.Data.Graph.Color
        • GHC.Data.Graph.Directed
        • Inductive
          • GHC.Data.Graph.Inductive.Graph
          • GHC.Data.Graph.Inductive.PatriciaTree
        • GHC.Data.Graph.Ops
        • GHC.Data.Graph.Ppr
        • GHC.Data.Graph.UnVar
      • GHC.Data.IOEnv
      • List
        • GHC.Data.List.Infinite
        • GHC.Data.List.SetOps
      • GHC.Data.Maybe
      • GHC.Data.OrdList
      • GHC.Data.OsPath
      • GHC.Data.Pair
      • GHC.Data.ShortText
      • GHC.Data.SizedSeq
      • GHC.Data.SmallArray
      • GHC.Data.Stream
      • GHC.Data.Strict
      • GHC.Data.StringBuffer
      • GHC.Data.TrieMap
      • GHC.Data.Unboxed
      • GHC.Data.UnionFind
      • GHC.Data.Word64Map
        • GHC.Data.Word64Map.Internal
        • GHC.Data.Word64Map.Lazy
        • GHC.Data.Word64Map.Strict
          • GHC.Data.Word64Map.Strict.Internal
      • GHC.Data.Word64Set
        • GHC.Data.Word64Set.Internal
    • Driver
      • GHC.Driver.Backend
        • GHC.Driver.Backend.Internal
      • Backpack
        • GHC.Driver.Backpack.Syntax
      • GHC.Driver.CmdLine
      • GHC.Driver.CodeOutput
      • GHC.Driver.Config
        • GHC.Driver.Config.Cmm
          • GHC.Driver.Config.Cmm.Parser
        • GHC.Driver.Config.CmmToAsm
        • GHC.Driver.Config.CmmToLlvm
        • Core
          • GHC.Driver.Config.Core.Lint
            • GHC.Driver.Config.Core.Lint.Interactive
          • Opt
            • GHC.Driver.Config.Core.Opt.Arity
            • GHC.Driver.Config.Core.Opt.LiberateCase
            • GHC.Driver.Config.Core.Opt.Simplify
            • GHC.Driver.Config.Core.Opt.WorkWrap
          • GHC.Driver.Config.Core.Rules
        • GHC.Driver.Config.CoreToStg
          • GHC.Driver.Config.CoreToStg.Prep
        • GHC.Driver.Config.Diagnostic
        • GHC.Driver.Config.Finder
        • GHC.Driver.Config.HsToCore
          • GHC.Driver.Config.HsToCore.Ticks
          • GHC.Driver.Config.HsToCore.Usage
        • GHC.Driver.Config.Linker
        • GHC.Driver.Config.Logger
        • GHC.Driver.Config.Parser
        • Stg
          • GHC.Driver.Config.Stg.Debug
          • GHC.Driver.Config.Stg.Lift
          • GHC.Driver.Config.Stg.Pipeline
          • GHC.Driver.Config.Stg.Ppr
        • GHC.Driver.Config.StgToCmm
        • GHC.Driver.Config.StgToJS
        • GHC.Driver.Config.Tidy
      • GHC.Driver.DynFlags
      • GHC.Driver.Env
        • GHC.Driver.Env.KnotVars
        • GHC.Driver.Env.Types
      • GHC.Driver.Errors
        • GHC.Driver.Errors.Ppr
        • GHC.Driver.Errors.Types
      • GHC.Driver.Flags
      • GHC.Driver.GenerateCgIPEStub
      • GHC.Driver.Hooks
      • GHC.Driver.LlvmConfigCache
      • GHC.Driver.Main
      • GHC.Driver.Make
      • GHC.Driver.MakeSem
      • GHC.Driver.Monad
      • GHC.Driver.Phases
      • GHC.Driver.Pipeline
        • GHC.Driver.Pipeline.Execute
        • GHC.Driver.Pipeline.LogQueue
        • GHC.Driver.Pipeline.Monad
        • GHC.Driver.Pipeline.Phases
      • GHC.Driver.Plugins
        • GHC.Driver.Plugins.External
      • GHC.Driver.Ppr
      • GHC.Driver.Session
    • Exts
      • GHC.Exts.Heap
        • GHC.Exts.Heap.ClosureTypes
        • GHC.Exts.Heap.Closures
        • GHC.Exts.Heap.Constants
        • GHC.Exts.Heap.FFIClosures
        • GHC.Exts.Heap.FFIClosures_ProfilingDisabled
        • GHC.Exts.Heap.FFIClosures_ProfilingEnabled
        • GHC.Exts.Heap.InfoTable
          • GHC.Exts.Heap.InfoTable.Types
        • GHC.Exts.Heap.InfoTableProf
        • ProfInfo
          • GHC.Exts.Heap.ProfInfo.PeekProfInfo
          • GHC.Exts.Heap.ProfInfo.PeekProfInfo_ProfilingDisabled
          • GHC.Exts.Heap.ProfInfo.PeekProfInfo_ProfilingEnabled
          • GHC.Exts.Heap.ProfInfo.Types
        • GHC.Exts.Heap.Utils
    • GHC.ForeignSrcLang
      • GHC.ForeignSrcLang.Type
    • GHC.Hs
      • GHC.Hs.Basic
      • GHC.Hs.Binds
      • GHC.Hs.Decls
      • GHC.Hs.Doc
      • GHC.Hs.DocString
      • GHC.Hs.Dump
      • GHC.Hs.Expr
      • GHC.Hs.Extension
      • GHC.Hs.ImpExp
      • GHC.Hs.Instances
      • GHC.Hs.Lit
      • GHC.Hs.Pat
      • GHC.Hs.Specificity
      • GHC.Hs.Stats
      • Syn
        • GHC.Hs.Syn.Type
      • GHC.Hs.Type
      • GHC.Hs.Utils
    • GHC.HsToCore
      • GHC.HsToCore.Arrows
      • GHC.HsToCore.Binds
      • GHC.HsToCore.Breakpoints
      • GHC.HsToCore.Coverage
      • GHC.HsToCore.Docs
      • Errors
        • GHC.HsToCore.Errors.Ppr
        • GHC.HsToCore.Errors.Types
      • GHC.HsToCore.Expr
      • Foreign
        • GHC.HsToCore.Foreign.C
        • GHC.HsToCore.Foreign.Call
        • GHC.HsToCore.Foreign.Decl
        • GHC.HsToCore.Foreign.JavaScript
        • GHC.HsToCore.Foreign.Prim
        • GHC.HsToCore.Foreign.Utils
        • GHC.HsToCore.Foreign.Wasm
      • GHC.HsToCore.GuardedRHSs
      • GHC.HsToCore.ListComp
      • GHC.HsToCore.Match
        • GHC.HsToCore.Match.Constructor
        • GHC.HsToCore.Match.Literal
      • GHC.HsToCore.Monad
      • GHC.HsToCore.Pmc
        • GHC.HsToCore.Pmc.Check
        • GHC.HsToCore.Pmc.Desugar
        • GHC.HsToCore.Pmc.Ppr
        • GHC.HsToCore.Pmc.Solver
          • GHC.HsToCore.Pmc.Solver.Types
        • GHC.HsToCore.Pmc.Types
        • GHC.HsToCore.Pmc.Utils
      • GHC.HsToCore.Quote
      • GHC.HsToCore.Ticks
      • GHC.HsToCore.Types
      • GHC.HsToCore.Usage
      • GHC.HsToCore.Utils
    • Iface
      • GHC.Iface.Binary
      • GHC.Iface.Decl
      • GHC.Iface.Env
      • GHC.Iface.Errors
        • GHC.Iface.Errors.Ppr
        • GHC.Iface.Errors.Types
      • Ext
        • GHC.Iface.Ext.Ast
        • GHC.Iface.Ext.Binary
        • GHC.Iface.Ext.Debug
        • GHC.Iface.Ext.Fields
        • GHC.Iface.Ext.Types
        • GHC.Iface.Ext.Utils
      • GHC.Iface.Load
      • GHC.Iface.Make
      • GHC.Iface.Recomp
        • GHC.Iface.Recomp.Binary
        • GHC.Iface.Recomp.Flags
      • GHC.Iface.Rename
      • GHC.Iface.Syntax
      • GHC.Iface.Tidy
        • GHC.Iface.Tidy.StaticPtrTable
      • GHC.Iface.Type
      • GHC.Iface.Warnings
    • GHC.IfaceToCore
    • Internal
      • GHC.Internal.ForeignSrcLang
      • GHC.Internal.LanguageExtensions
      • GHC.Internal.Lexeme
      • TH
        • Lib
          • GHC.Internal.TH.Lib.Map
        • GHC.Internal.TH.Ppr
        • GHC.Internal.TH.PprLib
        • GHC.Internal.TH.Syntax
    • JS
      • GHC.JS.Ident
      • JStg
        • GHC.JS.JStg.Monad
        • GHC.JS.JStg.Syntax
      • GHC.JS.Make
      • Opt
        • GHC.JS.Opt.Expr
        • GHC.JS.Opt.Simple
      • GHC.JS.Optimizer
      • GHC.JS.Ppr
      • GHC.JS.Syntax
      • GHC.JS.Transform
    • GHC.LanguageExtensions
      • GHC.LanguageExtensions.Type
    • GHC.Lexeme
    • Linker
      • GHC.Linker.Config
      • GHC.Linker.Deps
      • GHC.Linker.Dynamic
      • GHC.Linker.External
      • GHC.Linker.ExtraObj
      • GHC.Linker.Loader
      • GHC.Linker.MacOS
      • GHC.Linker.Static
        • GHC.Linker.Static.Utils
      • GHC.Linker.Types
      • GHC.Linker.Unit
      • GHC.Linker.Windows
    • GHC.Llvm
      • GHC.Llvm.MetaData
      • GHC.Llvm.Ppr
      • GHC.Llvm.Syntax
      • GHC.Llvm.Types
    • GHC.Parser
      • GHC.Parser.Annotation
      • GHC.Parser.CharClass
      • Errors
        • GHC.Parser.Errors.Basic
        • GHC.Parser.Errors.Ppr
        • GHC.Parser.Errors.Types
      • GHC.Parser.HaddockLex
      • GHC.Parser.Header
      • GHC.Parser.Lexer
      • GHC.Parser.PostProcess
        • GHC.Parser.PostProcess.Haddock
      • GHC.Parser.String
      • GHC.Parser.Types
      • GHC.Parser.Utils
    • GHC.Platform
      • GHC.Platform.AArch64
      • GHC.Platform.ARM
      • GHC.Platform.ArchOS
      • GHC.Platform.Constants
      • GHC.Platform.Host
      • GHC.Platform.LoongArch64
      • GHC.Platform.NoRegs
      • GHC.Platform.PPC
      • GHC.Platform.Profile
      • GHC.Platform.RISCV64
      • GHC.Platform.Reg
        • GHC.Platform.Reg.Class
          • GHC.Platform.Reg.Class.NoVectors
          • GHC.Platform.Reg.Class.Separate
          • GHC.Platform.Reg.Class.Unified
      • GHC.Platform.Regs
      • GHC.Platform.S390X
      • GHC.Platform.Wasm32
      • GHC.Platform.Ways
      • GHC.Platform.X86
      • GHC.Platform.X86_64
    • GHC.Plugins
    • GHC.Prelude
      • GHC.Prelude.Basic
    • Rename
      • GHC.Rename.Bind
      • GHC.Rename.Doc
      • GHC.Rename.Env
      • GHC.Rename.Expr
      • GHC.Rename.Fixity
      • GHC.Rename.HsType
      • GHC.Rename.Module
      • GHC.Rename.Names
      • GHC.Rename.Pat
      • GHC.Rename.Splice
      • GHC.Rename.Unbound
      • GHC.Rename.Utils
    • Runtime
      • GHC.Runtime.Context
      • GHC.Runtime.Eval
        • GHC.Runtime.Eval.Types
      • Heap
        • GHC.Runtime.Heap.Inspect
        • GHC.Runtime.Heap.Layout
      • GHC.Runtime.Interpreter
        • GHC.Runtime.Interpreter.JS
        • GHC.Runtime.Interpreter.Process
        • GHC.Runtime.Interpreter.Types
        • GHC.Runtime.Interpreter.Wasm
      • GHC.Runtime.Loader
      • GHC.Runtime.Utils
    • GHC.Serialized
    • GHC.Settings
      • GHC.Settings.Config
      • GHC.Settings.Constants
      • GHC.Settings.IO
      • GHC.Settings.Utils
    • Stg
      • GHC.Stg.BcPrep
      • GHC.Stg.CSE
      • GHC.Stg.Debug
      • GHC.Stg.FVs
      • GHC.Stg.InferTags
        • GHC.Stg.InferTags.Rewrite
        • GHC.Stg.InferTags.TagSig
        • GHC.Stg.InferTags.Types
      • GHC.Stg.Lift
        • GHC.Stg.Lift.Analysis
        • GHC.Stg.Lift.Config
        • GHC.Stg.Lift.Monad
        • GHC.Stg.Lift.Types
      • GHC.Stg.Lint
      • GHC.Stg.Make
      • GHC.Stg.Pipeline
      • GHC.Stg.Stats
      • GHC.Stg.Subst
      • GHC.Stg.Syntax
      • GHC.Stg.Unarise
      • GHC.Stg.Utils
    • GHC.StgToByteCode
    • GHC.StgToCmm
      • GHC.StgToCmm.ArgRep
      • GHC.StgToCmm.Bind
      • GHC.StgToCmm.CgUtils
      • GHC.StgToCmm.Closure
      • GHC.StgToCmm.Config
      • GHC.StgToCmm.DataCon
      • GHC.StgToCmm.Env
      • GHC.StgToCmm.Expr
      • GHC.StgToCmm.ExtCode
      • GHC.StgToCmm.Foreign
      • GHC.StgToCmm.Heap
      • GHC.StgToCmm.Hpc
      • GHC.StgToCmm.InfoTableProv
      • GHC.StgToCmm.Layout
      • GHC.StgToCmm.Lit
      • GHC.StgToCmm.Monad
      • GHC.StgToCmm.Prim
      • GHC.StgToCmm.Prof
      • GHC.StgToCmm.Sequel
      • GHC.StgToCmm.TagCheck
      • GHC.StgToCmm.Ticky
      • GHC.StgToCmm.Types
      • GHC.StgToCmm.Utils
    • GHC.StgToJS
      • GHC.StgToJS.Apply
      • GHC.StgToJS.Arg
      • GHC.StgToJS.Closure
      • GHC.StgToJS.CodeGen
      • GHC.StgToJS.DataCon
      • GHC.StgToJS.Deps
      • GHC.StgToJS.Expr
      • GHC.StgToJS.ExprCtx
      • GHC.StgToJS.FFI
      • GHC.StgToJS.Heap
      • GHC.StgToJS.Ids
      • Linker
        • GHC.StgToJS.Linker.Linker
        • GHC.StgToJS.Linker.Opt
        • GHC.StgToJS.Linker.Types
        • GHC.StgToJS.Linker.Utils
      • GHC.StgToJS.Literal
      • GHC.StgToJS.Monad
      • GHC.StgToJS.Object
      • GHC.StgToJS.Prim
      • GHC.StgToJS.Profiling
      • GHC.StgToJS.Regs
      • Rts
        • GHC.StgToJS.Rts.Rts
        • GHC.StgToJS.Rts.Types
      • GHC.StgToJS.Sinker
      • GHC.StgToJS.Stack
      • GHC.StgToJS.StaticPtr
      • GHC.StgToJS.Symbols
      • GHC.StgToJS.Types
      • GHC.StgToJS.Utils
    • GHC.SysTools
      • GHC.SysTools.Ar
      • GHC.SysTools.BaseDir
      • GHC.SysTools.Cpp
      • GHC.SysTools.Elf
      • GHC.SysTools.Process
      • GHC.SysTools.Tasks
      • GHC.SysTools.Terminal
    • Tc
      • GHC.Tc.Deriv
        • GHC.Tc.Deriv.Functor
        • GHC.Tc.Deriv.Generate
        • GHC.Tc.Deriv.Generics
        • GHC.Tc.Deriv.Infer
        • GHC.Tc.Deriv.Utils
      • GHC.Tc.Errors
        • GHC.Tc.Errors.Hole
          • GHC.Tc.Errors.Hole.FitTypes
          • GHC.Tc.Errors.Hole.Plugin
        • GHC.Tc.Errors.Ppr
        • GHC.Tc.Errors.Types
          • GHC.Tc.Errors.Types.PromotionErr
      • Gen
        • GHC.Tc.Gen.Annotation
        • GHC.Tc.Gen.App
        • GHC.Tc.Gen.Arrow
        • GHC.Tc.Gen.Bind
        • GHC.Tc.Gen.Default
        • GHC.Tc.Gen.Do
        • GHC.Tc.Gen.Export
        • GHC.Tc.Gen.Expr
        • GHC.Tc.Gen.Foreign
        • GHC.Tc.Gen.Head
        • GHC.Tc.Gen.HsType
        • GHC.Tc.Gen.Match
        • GHC.Tc.Gen.Pat
        • GHC.Tc.Gen.Rule
        • GHC.Tc.Gen.Sig
        • GHC.Tc.Gen.Splice
      • Instance
        • GHC.Tc.Instance.Class
        • GHC.Tc.Instance.Family
        • GHC.Tc.Instance.FunDeps
        • GHC.Tc.Instance.Typeable
      • GHC.Tc.Module
      • GHC.Tc.Plugin
      • GHC.Tc.Solver
        • GHC.Tc.Solver.Dict
        • GHC.Tc.Solver.Equality
        • GHC.Tc.Solver.InertSet
        • GHC.Tc.Solver.Irred
        • GHC.Tc.Solver.Monad
        • GHC.Tc.Solver.Rewrite
        • GHC.Tc.Solver.Solve
        • GHC.Tc.Solver.Types
      • GHC.Tc.TyCl
        • GHC.Tc.TyCl.Build
        • GHC.Tc.TyCl.Class
        • GHC.Tc.TyCl.Instance
        • GHC.Tc.TyCl.PatSyn
        • GHC.Tc.TyCl.Utils
      • GHC.Tc.Types
        • GHC.Tc.Types.BasicTypes
        • GHC.Tc.Types.Constraint
        • GHC.Tc.Types.CtLoc
        • GHC.Tc.Types.ErrCtxt
        • GHC.Tc.Types.EvTerm
        • GHC.Tc.Types.Evidence
        • GHC.Tc.Types.LclEnv
        • GHC.Tc.Types.Origin
        • GHC.Tc.Types.Rank
        • GHC.Tc.Types.TH
        • GHC.Tc.Types.TcRef
      • Utils
        • GHC.Tc.Utils.Backpack
        • GHC.Tc.Utils.Concrete
        • GHC.Tc.Utils.Env
        • GHC.Tc.Utils.Instantiate
        • GHC.Tc.Utils.Monad
        • GHC.Tc.Utils.TcMType
        • GHC.Tc.Utils.TcType
        • GHC.Tc.Utils.Unify
      • GHC.Tc.Validity
      • Zonk
        • GHC.Tc.Zonk.Env
        • GHC.Tc.Zonk.Monad
        • GHC.Tc.Zonk.TcType
        • GHC.Tc.Zonk.Type
    • GHC.ThToHs
    • Types
      • GHC.Types.Annotations
      • GHC.Types.Avail
      • GHC.Types.Basic
      • GHC.Types.Breakpoint
      • GHC.Types.CompleteMatch
      • GHC.Types.CostCentre
        • GHC.Types.CostCentre.State
      • GHC.Types.Cpr
      • GHC.Types.DefaultEnv
      • GHC.Types.Demand
      • GHC.Types.Error
        • GHC.Types.Error.Codes
      • GHC.Types.FieldLabel
      • GHC.Types.Fixity
        • GHC.Types.Fixity.Env
      • GHC.Types.ForeignCall
      • GHC.Types.ForeignStubs
      • GHC.Types.GREInfo
      • GHC.Types.Hint
        • GHC.Types.Hint.Ppr
      • GHC.Types.HpcInfo
      • GHC.Types.IPE
      • GHC.Types.Id
        • GHC.Types.Id.Info
        • GHC.Types.Id.Make
      • GHC.Types.Literal
      • GHC.Types.Meta
      • GHC.Types.Name
        • GHC.Types.Name.Cache
        • GHC.Types.Name.Env
        • GHC.Types.Name.Occurrence
        • GHC.Types.Name.Ppr
        • GHC.Types.Name.Reader
        • GHC.Types.Name.Set
        • GHC.Types.Name.Shape
      • GHC.Types.PkgQual
      • GHC.Types.ProfAuto
      • GHC.Types.RepType
      • GHC.Types.SafeHaskell
      • GHC.Types.SaneDouble
      • GHC.Types.SourceError
      • GHC.Types.SourceFile
      • GHC.Types.SourceText
      • GHC.Types.SptEntry
      • GHC.Types.SrcLoc
      • GHC.Types.Target
      • GHC.Types.Tickish
      • GHC.Types.TyThing
        • GHC.Types.TyThing.Ppr
      • GHC.Types.TypeEnv
      • GHC.Types.Unique
        • GHC.Types.Unique.DFM
        • GHC.Types.Unique.DSM
        • GHC.Types.Unique.DSet
        • GHC.Types.Unique.FM
        • GHC.Types.Unique.Map
        • GHC.Types.Unique.MemoFun
        • GHC.Types.Unique.SDFM
        • GHC.Types.Unique.Set
        • GHC.Types.Unique.Supply
      • GHC.Types.Var
        • GHC.Types.Var.Env
        • GHC.Types.Var.Set
    • GHC.UniqueSubdir
    • GHC.Unit
      • GHC.Unit.Database
      • GHC.Unit.Env
      • GHC.Unit.External
      • GHC.Unit.Finder
        • GHC.Unit.Finder.Types
      • GHC.Unit.Home
        • GHC.Unit.Home.ModInfo
      • GHC.Unit.Info
      • GHC.Unit.Module
        • GHC.Unit.Module.Deps
        • GHC.Unit.Module.Env
        • GHC.Unit.Module.Graph
        • GHC.Unit.Module.Imported
        • GHC.Unit.Module.Location
        • GHC.Unit.Module.ModDetails
        • GHC.Unit.Module.ModGuts
        • GHC.Unit.Module.ModIface
        • GHC.Unit.Module.ModSummary
        • GHC.Unit.Module.Status
        • GHC.Unit.Module.Warnings
        • GHC.Unit.Module.WholeCoreBindings
      • GHC.Unit.Parser
      • GHC.Unit.Ppr
      • GHC.Unit.State
      • GHC.Unit.Types
    • Utils
      • GHC.Utils.Asm
      • GHC.Utils.Binary
        • GHC.Utils.Binary.Typeable
      • GHC.Utils.BufHandle
      • GHC.Utils.CliOption
      • GHC.Utils.Constants
      • Containers
        • Internal
          • GHC.Utils.Containers.Internal.BitUtil
          • GHC.Utils.Containers.Internal.StrictPair
      • GHC.Utils.Encoding
        • GHC.Utils.Encoding.UTF8
      • GHC.Utils.Error
      • GHC.Utils.Exception
      • GHC.Utils.FV
      • GHC.Utils.Fingerprint
      • GHC.Utils.GlobalVars
      • IO
        • GHC.Utils.IO.Unsafe
      • GHC.Utils.Json
      • GHC.Utils.Lexeme
      • GHC.Utils.Logger
      • GHC.Utils.Misc
      • GHC.Utils.Monad
        • GHC.Utils.Monad.Codensity
        • State
          • GHC.Utils.Monad.State.Strict
      • GHC.Utils.Outputable
      • GHC.Utils.Panic
        • GHC.Utils.Panic.Plain
      • GHC.Utils.Ppr
        • GHC.Utils.Ppr.Colour
      • GHC.Utils.TmpFs
      • GHC.Utils.Touch
      • GHC.Utils.Trace
      • GHC.Utils.Unique
      • GHC.Utils.Word64
    • GHC.Version
    • Wasm
      • GHC.Wasm.ControlFlow
        • GHC.Wasm.ControlFlow.FromCmm
  • GHCi
    • GHCi.BreakArray
    • GHCi.FFI
    • GHCi.Message
    • GHCi.RemoteTypes
    • GHCi.ResolvedBCO
    • TH
      • GHCi.TH.Binary
  • Language
    • Haskell
      • Language.Haskell.Syntax
        • Language.Haskell.Syntax.Basic
        • Language.Haskell.Syntax.Binds
        • Language.Haskell.Syntax.Decls
        • Language.Haskell.Syntax.Expr
        • Language.Haskell.Syntax.Extension
        • Language.Haskell.Syntax.ImpExp
        • Language.Haskell.Syntax.Lit
        • Module
          • Language.Haskell.Syntax.Module.Name
        • Language.Haskell.Syntax.Pat
        • Language.Haskell.Syntax.Specificity
        • Language.Haskell.Syntax.Type
  • Paths_ghc_lib

Flags

Manual Flags

NameDescriptionDefault
threaded-rts

Pass -DTHREADED_RTS to the C toolchain

Enabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0, 0.20190204, 0.20190402, 0.20190423, 0.20190516, 0.20190523, 0.20190523.1, 0.20190603, 0.20190703, 0.20190806, 0.20190903, 0.20190909, 0.20191002, 0.20191101, 0.20191201, 0.20200102, 0.20200201, 0.20200205, 0.20200301, 0.20200401, 0.20200501, 0.20200601, 0.20200704, 0.20200801, 0.20200901, 0.20201001, 0.20201101, 0.20201201, 0.20210101, 0.20210201, 0.20210228, 0.20210331, 0.20210501, 0.20210601, 0.20210701, 0.20210801, 0.20210901, 0.20211001, 0.20211101, 0.20211201, 0.20220103, 0.20220201, 0.20220301, 0.20220401, 0.20220501, 0.20220601, 0.20220701, 0.20220801, 0.20220901, 0.20221001, 0.20221101, 0.20221201, 8.8.0.20190424, 8.8.0.20190723, 8.8.1, 8.8.1.20191204, 8.8.1.20210620, 8.8.2, 8.8.2.20200205, 8.8.2.20210620, 8.8.3.20200224, 8.8.3.20200412, 8.8.3.20200412.1, 8.8.3.20210620, 8.8.4.20200716, 8.8.4.20210620, 8.10.1.20200324, 8.10.1.20200412, 8.10.1.20200518, 8.10.1.20200523, 8.10.1.20200916, 8.10.2.20200808, 8.10.2.20200916, 8.10.3.20201220, 8.10.4.20210206, 8.10.5.20210606, 8.10.6.20210814, 8.10.7.20210828, 8.10.7.20220219, 9.0.1.20210205, 9.0.1.20210207, 9.0.1.20210324, 9.0.2.20211226, 9.2.1.20211030, 9.2.1.20211101, 9.2.1.20220109, 9.2.2.20220307, 9.2.3.20220527, 9.2.3.20220709, 9.2.4.20220729, 9.2.5.20221107, 9.2.6.20230211, 9.2.7.20230228, 9.2.8.20230729, 9.4.1.20220807, 9.4.2.20220822, 9.4.3.20221104, 9.4.4.20221225, 9.4.5.20230430, 9.4.6.20230808, 9.4.7.20230826, 9.4.8.20231111, 9.6.1.20230312, 9.6.2.20230523, 9.6.2.20231121, 9.6.3.20231014, 9.6.3.20231121, 9.6.4.20240109, 9.6.5.20240423, 9.6.6.20240701, 9.6.7.20250325, 9.8.1.20231009, 9.8.1.20231121, 9.8.2.20240223, 9.8.3.20241022, 9.8.3.20241103, 9.8.4.20241130, 9.8.5.20250214, 9.10.1.20240511, 9.10.1.20241103, 9.10.1.20250103, 9.10.1.20250421, 9.10.2.20250503, 9.10.2.20250515, 9.10.3.20250912, 9.12.1.20241218, 9.12.1.20250103, 9.12.1.20250105, 9.12.1.20250314, 9.12.2.20250320, 9.12.2.20250421
Dependencies array (>=0.1 && <0.6), base (>=4.19 && <4.22), binary (>=0.8 && <0.9), bytestring (>=0.11.4 && <0.13), containers (>=0.6.2.1 && <0.8), deepseq (>=1.4 && <1.6), directory (>=1 && <1.4), exceptions (>=0.10 && <0.11), filepath (>=1.5 && <1.6), ghc-lib-parser (==9.12.2.20250421), ghc-prim (>0.2 && <0.14), hpc (>=0.6 && <0.8), os-string (>=2.0.1 && <2.1), parsec, pretty (>=1.1 && <1.2), process (>=1 && <1.7), rts, semaphore-compat, stm, time (>=1.4 && <1.15), transformers (>=0.5 && <0.7), unix, Win32 [details]
License BSD-3-Clause
Author The GHC Team and Digital Asset
Maintainer Digital Asset
Category Development
Home page https://github.com/digital-asset/ghc-lib
Bug tracker https://github.com/digital-asset/ghc-lib/issues
Source repo head: git clone git@github.com:digital-asset/ghc-lib.git
Uploaded by shayne_fletcher at 2025-04-22T00:14:00Z
Distributions LTSHaskell:9.12.2.20250421, NixOS:9.8.5.20250214, Stackage:9.12.2.20250421
Reverse Dependencies 4 direct, 42 indirect [details]
Downloads 47123 total (482 in the last 30 days)
Rating 2.25 (votes: 2) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs pending
Build status unknown [no reports yet]