cabal-version: 3.0 build-type: Simple name: ghc-lib version: 9.8.2.20240223 license: BSD-3-Clause license-file: LICENSE category: Development author: The GHC Team and Digital Asset maintainer: Digital Asset synopsis: The GHC API, decoupled from GHC versions description: A package equivalent to the @ghc@ package, but which can be loaded on many compiler versions. homepage: https://github.com/digital-asset/ghc-lib bug-reports: https://github.com/digital-asset/ghc-lib/issues data-dir: ghc-lib/stage0/lib data-files: settings llvm-targets llvm-passes extra-source-files: ghc-lib/stage0/rts/build/include/ghcautoconf.h ghc-lib/stage0/rts/build/include/ghcplatform.h ghc-lib/stage0/rts/build/include/GhclibDerivedConstants.h ghc-lib/stage0/compiler/build/primop-can-fail.hs-incl ghc-lib/stage0/compiler/build/primop-code-size.hs-incl ghc-lib/stage0/compiler/build/primop-commutable.hs-incl ghc-lib/stage0/compiler/build/primop-data-decl.hs-incl ghc-lib/stage0/compiler/build/primop-fixity.hs-incl ghc-lib/stage0/compiler/build/primop-has-side-effects.hs-incl ghc-lib/stage0/compiler/build/primop-list.hs-incl ghc-lib/stage0/compiler/build/primop-out-of-line.hs-incl ghc-lib/stage0/compiler/build/primop-primop-info.hs-incl ghc-lib/stage0/compiler/build/primop-strictness.hs-incl ghc-lib/stage0/compiler/build/primop-tag.hs-incl ghc-lib/stage0/compiler/build/primop-vector-tycons.hs-incl ghc-lib/stage0/compiler/build/primop-vector-tys-exports.hs-incl ghc-lib/stage0/compiler/build/primop-vector-tys.hs-incl ghc-lib/stage0/compiler/build/primop-vector-uniques.hs-incl ghc-lib/stage0/compiler/build/primop-docs.hs-incl ghc-lib/stage0/compiler/build/GHC/Platform/Constants.hs libraries/containers/containers/include/containers.h compiler/ghc-llvm-version.h rts/include/ghcconfig.h compiler/MachRegs.h compiler/CodeGen.Platform.h compiler/Bytecodes.h compiler/ClosureTypes.h compiler/FunTypes.h compiler/Unique.h source-repository head type: git location: git@github.com:digital-asset/ghc-lib.git flag threaded-rts default: True manual: True description: Pass -DTHREADED_RTS to the C toolchain library default-language: Haskell2010 exposed: False include-dirs: rts/include ghc-lib/stage0/lib ghc-lib/stage0/compiler/build compiler libraries/containers/containers/include if flag(threaded-rts) ghc-options: -fobject-code -package=ghc-boot-th -optc-DTHREADED_RTS cc-options: -DTHREADED_RTS cpp-options: -DTHREADED_RTS else ghc-options: -fobject-code -package=ghc-boot-th cpp-options: if !os(windows) build-depends: unix else build-depends: Win32 build-depends: base >= 4.17 && < 4.20, ghc-prim > 0.2 && < 0.12, containers >= 0.6.2.1 && < 0.7, bytestring >= 0.11.4 && < 0.13, time >= 1.4 && < 1.13, exceptions == 0.10.*, parsec, binary == 0.8.*, filepath >= 1 && < 1.5, directory >= 1 && < 1.4, array >= 0.1 && < 0.6, deepseq >= 1.4 && < 1.6, pretty == 1.1.*, transformers >= 0.5 && < 0.7, process >= 1 && < 1.7, stm, semaphore-compat, rts, hpc >= 0.6 && < 0.8, ghc-lib-parser == 9.8.2.20240223 build-tool-depends: alex:alex >= 3.1, happy:happy >= 1.19.4 other-extensions: BangPatterns CPP DataKinds DefaultSignatures DeriveDataTypeable DeriveFoldable DeriveFunctor DeriveGeneric DeriveTraversable DisambiguateRecordFields ExistentialQuantification ExplicitForAll FlexibleContexts FlexibleInstances GADTs GeneralizedNewtypeDeriving InstanceSigs MagicHash MultiParamTypeClasses NamedFieldPuns NondecreasingIndentation RankNTypes RecordWildCards RoleAnnotations ScopedTypeVariables StandaloneDeriving Trustworthy TupleSections TypeFamilies TypeSynonymInstances UnboxedTuples UndecidableInstances default-extensions: BangPatterns ImplicitPrelude MonoLocalBinds NoImplicitPrelude ScopedTypeVariables TypeOperators hs-source-dirs: ghc-lib/stage0/libraries/ghc-boot/build ghc-lib/stage0/compiler/build libraries/ghci compiler autogen-modules: Paths_ghc_lib reexported-modules: GHC.BaseDir, GHC.Builtin.Names, GHC.Builtin.PrimOps, GHC.Builtin.PrimOps.Ids, GHC.Builtin.Types, GHC.Builtin.Types.Prim, GHC.Builtin.Uniques, GHC.ByteCode.Types, GHC.Cmm, GHC.Cmm.BlockId, GHC.Cmm.CLabel, GHC.Cmm.Dataflow.Block, GHC.Cmm.Dataflow.Collections, GHC.Cmm.Dataflow.Graph, GHC.Cmm.Dataflow.Label, GHC.Cmm.Expr, GHC.Cmm.MachOp, GHC.Cmm.Node, GHC.Cmm.Reg, GHC.Cmm.Switch, GHC.Cmm.Type, GHC.CmmToAsm.CFG.Weight, GHC.CmmToLlvm.Config, 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.Lint, GHC.Core.Lint.Interactive, GHC.Core.Make, GHC.Core.Map.Expr, GHC.Core.Map.Type, GHC.Core.Multiplicity, GHC.Core.Opt.Arity, GHC.Core.Opt.CallerCC, GHC.Core.Opt.CallerCC.Types, GHC.Core.Opt.ConstantFold, GHC.Core.Opt.Monad, GHC.Core.Opt.OccurAnal, GHC.Core.Opt.Pipeline.Types, 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.Stats, 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, 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.Type, GHC.Core.Unfold, GHC.Core.Unfold.Make, GHC.Core.Unify, GHC.Core.UsageEnv, GHC.Core.Utils, GHC.CoreToIface, GHC.Data.Bag, GHC.Data.Bool, GHC.Data.BooleanFormula, GHC.Data.EnumSet, GHC.Data.FastMutInt, GHC.Data.FastString, GHC.Data.FastString.Env, GHC.Data.FiniteMap, GHC.Data.Graph.Directed, GHC.Data.Graph.UnVar, GHC.Data.IOEnv, GHC.Data.List.Infinite, GHC.Data.List.SetOps, GHC.Data.Maybe, GHC.Data.OrdList, 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.Driver.Backend, GHC.Driver.Backend.Internal, GHC.Driver.Backpack.Syntax, GHC.Driver.CmdLine, GHC.Driver.Config, GHC.Driver.Config.Core.Lint, GHC.Driver.Config.Diagnostic, GHC.Driver.Config.Logger, GHC.Driver.Config.Parser, 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.Hooks, GHC.Driver.LlvmConfigCache, GHC.Driver.Monad, GHC.Driver.Phases, GHC.Driver.Pipeline.Monad, GHC.Driver.Pipeline.Phases, GHC.Driver.Plugins, GHC.Driver.Plugins.External, GHC.Driver.Ppr, GHC.Driver.Session, 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, 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.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.Type, GHC.Hs.Utils, GHC.HsToCore.Errors.Ppr, GHC.HsToCore.Errors.Types, GHC.HsToCore.Pmc.Ppr, GHC.HsToCore.Pmc.Solver.Types, GHC.HsToCore.Pmc.Types, GHC.Iface.Decl, GHC.Iface.Errors.Ppr, GHC.Iface.Errors.Types, GHC.Iface.Ext.Fields, GHC.Iface.Recomp.Binary, GHC.Iface.Syntax, GHC.Iface.Type, GHC.JS.Make, GHC.JS.Ppr, GHC.JS.Syntax, GHC.JS.Transform, GHC.JS.Unsat.Syntax, GHC.LanguageExtensions, GHC.LanguageExtensions.Type, GHC.Lexeme, GHC.Linker.Static.Utils, GHC.Linker.Types, GHC.Parser, GHC.Parser.Annotation, GHC.Parser.CharClass, 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.Types, GHC.Platform, GHC.Platform.AArch64, GHC.Platform.ARM, GHC.Platform.ArchOS, GHC.Platform.Constants, GHC.Platform.LoongArch64, GHC.Platform.NoRegs, GHC.Platform.PPC, GHC.Platform.Profile, GHC.Platform.RISCV64, GHC.Platform.Reg, GHC.Platform.Reg.Class, GHC.Platform.Regs, GHC.Platform.S390X, GHC.Platform.Wasm32, GHC.Platform.Ways, GHC.Platform.X86, GHC.Platform.X86_64, GHC.Prelude, GHC.Prelude.Basic, GHC.Runtime.Context, GHC.Runtime.Eval.Types, GHC.Runtime.Heap.Layout, GHC.Runtime.Interpreter.Types, GHC.Serialized, GHC.Settings, GHC.Settings.Config, GHC.Settings.Constants, GHC.Settings.Utils, GHC.Stg.InferTags.TagSig, GHC.Stg.Lift.Types, GHC.Stg.Syntax, GHC.StgToCmm.Config, GHC.StgToCmm.Types, GHC.StgToJS.Linker.Types, GHC.StgToJS.Object, GHC.StgToJS.Types, GHC.SysTools.BaseDir, GHC.SysTools.Terminal, GHC.Tc.Errors.Hole.FitTypes, GHC.Tc.Errors.Hole.Plugin, GHC.Tc.Errors.Ppr, GHC.Tc.Errors.Types, GHC.Tc.Errors.Types.PromotionErr, GHC.Tc.Solver.InertSet, GHC.Tc.Solver.Types, GHC.Tc.Types, GHC.Tc.Types.BasicTypes, GHC.Tc.Types.Constraint, GHC.Tc.Types.CtLocEnv, GHC.Tc.Types.ErrCtxt, GHC.Tc.Types.Evidence, GHC.Tc.Types.LclEnv, GHC.Tc.Types.Origin, GHC.Tc.Types.Rank, GHC.Tc.Types.TH, GHC.Tc.Types.TcRef, GHC.Tc.Utils.TcType, GHC.Tc.Zonk.Monad, GHC.Types.Annotations, GHC.Types.Avail, GHC.Types.Basic, GHC.Types.BreakInfo, GHC.Types.CompleteMatch, GHC.Types.CostCentre, GHC.Types.CostCentre.State, GHC.Types.Cpr, 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.PkgQual, GHC.Types.ProfAuto, GHC.Types.RepType, GHC.Types.SafeHaskell, GHC.Types.SaneDouble, GHC.Types.SourceError, GHC.Types.SourceFile, GHC.Types.SourceText, 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.DSet, GHC.Types.Unique.FM, GHC.Types.Unique.Map, 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.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, GHC.Utils.Binary, GHC.Utils.Binary.Typeable, GHC.Utils.BufHandle, GHC.Utils.CliOption, GHC.Utils.Constants, GHC.Utils.Encoding, GHC.Utils.Encoding.UTF8, GHC.Utils.Error, GHC.Utils.Exception, GHC.Utils.FV, GHC.Utils.Fingerprint, GHC.Utils.GlobalVars, GHC.Utils.IO.Unsafe, GHC.Utils.Json, GHC.Utils.Lexeme, GHC.Utils.Logger, GHC.Utils.Misc, GHC.Utils.Monad, 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.Trace, GHC.Version, GHCi.BreakArray, GHCi.FFI, GHCi.Message, GHCi.RemoteTypes, GHCi.TH.Binary, Language.Haskell.Syntax, Language.Haskell.Syntax.Basic, Language.Haskell.Syntax.Binds, Language.Haskell.Syntax.Concrete, Language.Haskell.Syntax.Decls, Language.Haskell.Syntax.Expr, Language.Haskell.Syntax.Extension, Language.Haskell.Syntax.ImpExp, Language.Haskell.Syntax.Lit, Language.Haskell.Syntax.Module.Name, Language.Haskell.Syntax.Pat, Language.Haskell.Syntax.Type, Language.Haskell.TH, Language.Haskell.TH.LanguageExtensions, Language.Haskell.TH.Lib, Language.Haskell.TH.Lib.Internal, Language.Haskell.TH.Lib.Map, Language.Haskell.TH.Ppr, Language.Haskell.TH.PprLib, Language.Haskell.TH.Syntax exposed-modules: Paths_ghc_lib GHC GHC.Builtin.Names.TH GHC.Builtin.PrimOps.Casts GHC.Builtin.Types.Literals GHC.Builtin.Utils GHC.ByteCode.Asm GHC.ByteCode.InfoTable GHC.ByteCode.Instr GHC.ByteCode.Linker GHC.Cmm.CallConv GHC.Cmm.CommonBlockElim GHC.Cmm.Config GHC.Cmm.ContFlowOpt GHC.Cmm.Dataflow GHC.Cmm.DebugBlock GHC.Cmm.Dominators 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.Opt GHC.Cmm.Parser GHC.Cmm.Parser.Config GHC.Cmm.Parser.Monad GHC.Cmm.Pipeline GHC.Cmm.ProcPoint GHC.Cmm.Reducibility GHC.Cmm.Sink GHC.Cmm.Switch.Implement GHC.Cmm.ThreadSanitizer 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.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.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.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.Data GHC.CmmToLlvm.Mangler GHC.CmmToLlvm.Ppr GHC.CmmToLlvm.Regs GHC.Core.LateCC GHC.Core.Opt.CSE GHC.Core.Opt.CallArity 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.Pipeline GHC.Core.Opt.SetLevels GHC.Core.Opt.SpecConstr GHC.Core.Opt.Specialise GHC.Core.Opt.StaticArgs GHC.Core.Opt.WorkWrap GHC.Core.Opt.WorkWrap.Utils GHC.Core.TyCon.Set GHC.CoreToStg GHC.CoreToStg.Prep GHC.Data.Bitmap GHC.Data.Graph.Base GHC.Data.Graph.Collapse GHC.Data.Graph.Color GHC.Data.Graph.Inductive.Graph GHC.Data.Graph.Inductive.PatriciaTree GHC.Data.Graph.Ops GHC.Data.Graph.Ppr GHC.Data.UnionFind GHC.Driver.CodeOutput GHC.Driver.Config.Cmm GHC.Driver.Config.Cmm.Parser GHC.Driver.Config.CmmToAsm GHC.Driver.Config.CmmToLlvm GHC.Driver.Config.Core.Lint.Interactive 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.Finder GHC.Driver.Config.HsToCore GHC.Driver.Config.HsToCore.Ticks GHC.Driver.Config.HsToCore.Usage GHC.Driver.Config.Linker 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.GenerateCgIPEStub GHC.Driver.Main GHC.Driver.Make GHC.Driver.MakeSem GHC.Driver.Pipeline GHC.Driver.Pipeline.Execute GHC.Driver.Pipeline.LogQueue GHC.Hs.Stats GHC.Hs.Syn.Type GHC.HsToCore GHC.HsToCore.Arrows GHC.HsToCore.Binds GHC.HsToCore.Breakpoints GHC.HsToCore.Coverage GHC.HsToCore.Docs GHC.HsToCore.Expr 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.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.Solver GHC.HsToCore.Pmc.Utils GHC.HsToCore.Quote GHC.HsToCore.Ticks GHC.HsToCore.Types GHC.HsToCore.Usage GHC.HsToCore.Utils GHC.Iface.Binary GHC.Iface.Env GHC.Iface.Errors GHC.Iface.Ext.Ast GHC.Iface.Ext.Binary GHC.Iface.Ext.Debug GHC.Iface.Ext.Types GHC.Iface.Ext.Utils GHC.Iface.Load GHC.Iface.Make GHC.Iface.Recomp GHC.Iface.Recomp.Flags GHC.Iface.Rename GHC.Iface.Tidy GHC.Iface.Tidy.StaticPtrTable GHC.IfaceToCore GHC.JS.Optimizer GHC.Linker.Config GHC.Linker.Deps GHC.Linker.Dynamic GHC.Linker.ExtraObj GHC.Linker.Loader GHC.Linker.MacOS GHC.Linker.Static GHC.Linker.Unit GHC.Linker.Windows GHC.Llvm GHC.Llvm.MetaData GHC.Llvm.Ppr GHC.Llvm.Syntax GHC.Llvm.Types GHC.Parser.Utils GHC.Platform.Host GHC.Plugins 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 GHC.Runtime.Eval GHC.Runtime.Heap.Inspect GHC.Runtime.Interpreter GHC.Runtime.Interpreter.JS GHC.Runtime.Interpreter.Process GHC.Runtime.Loader GHC.Runtime.Utils GHC.Settings.IO GHC.Stg.BcPrep GHC.Stg.CSE GHC.Stg.Debug GHC.Stg.FVs GHC.Stg.InferTags GHC.Stg.InferTags.Rewrite GHC.Stg.InferTags.Types GHC.Stg.Lift GHC.Stg.Lift.Analysis GHC.Stg.Lift.Config GHC.Stg.Lift.Monad GHC.Stg.Lint GHC.Stg.Pipeline GHC.Stg.Stats GHC.Stg.Subst GHC.Stg.Unarise GHC.Stg.Utils GHC.StgToByteCode GHC.StgToCmm GHC.StgToCmm.ArgRep GHC.StgToCmm.Bind GHC.StgToCmm.CgUtils GHC.StgToCmm.Closure 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.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 GHC.StgToJS.Linker.Linker GHC.StgToJS.Linker.Opt GHC.StgToJS.Linker.Utils GHC.StgToJS.Literal GHC.StgToJS.Monad GHC.StgToJS.Prim GHC.StgToJS.Profiling GHC.StgToJS.Regs GHC.StgToJS.Rts.Rts GHC.StgToJS.Rts.Types GHC.StgToJS.Sinker GHC.StgToJS.Stack GHC.StgToJS.StaticPtr GHC.StgToJS.Symbols GHC.StgToJS.Utils GHC.SysTools GHC.SysTools.Ar GHC.SysTools.Cpp GHC.SysTools.Elf GHC.SysTools.Info GHC.SysTools.Process GHC.SysTools.Tasks 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.Gen.Annotation GHC.Tc.Gen.App GHC.Tc.Gen.Arrow GHC.Tc.Gen.Bind GHC.Tc.Gen.Default 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 GHC.Tc.Instance.Class GHC.Tc.Instance.Family GHC.Tc.Instance.FunDeps GHC.Tc.Instance.Typeable GHC.Tc.Module GHC.Tc.Solver GHC.Tc.Solver.Dict GHC.Tc.Solver.Equality GHC.Tc.Solver.Irred GHC.Tc.Solver.Monad GHC.Tc.Solver.Rewrite GHC.Tc.Solver.Solve 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.EvTerm 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.Unify GHC.Tc.Validity GHC.Tc.Zonk.Env GHC.Tc.Zonk.TcType GHC.Tc.Zonk.Type GHC.ThToHs GHC.Types.Name.Shape GHC.Types.Unique.MemoFun GHC.Unit.Finder GHC.Utils.Asm GHC.Utils.Monad.Codensity GHC.Wasm.ControlFlow GHC.Wasm.ControlFlow.FromCmm GHCi.BinaryArray GHCi.ResolvedBCO