cabal-version: >=1.22 build-type: Simple name: ghc-lib version: 0.20200201 license: BSD3 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 platformConstants extra-source-files: ghc-lib/stage0/lib/ghcautoconf.h ghc-lib/stage0/lib/ghcplatform.h ghc-lib/stage0/lib/ghcversion.h ghc-lib/stage0/lib/DerivedConstants.h ghc-lib/stage0/lib/GHCConstantsHaskellExports.hs ghc-lib/stage0/lib/GHCConstantsHaskellType.hs ghc-lib/stage0/lib/GHCConstantsHaskellWrappers.hs 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 includes/ghcconfig.h includes/MachDeps.h includes/stg/MachRegs.h includes/CodeGen.Platform.hs compiler/HsVersions.h compiler/Unique.h tested-with: GHC==8.8.2, GHC==8.6.5, GHC==8.4.4 source-repository head type: git location: git@github.com:digital-asset/ghc-lib.git library default-language: Haskell2010 default-extensions: NoImplicitPrelude exposed: False include-dirs: includes ghc-lib/stage0/lib ghc-lib/stage0/compiler/build compiler ghc-options: -fobject-code -package=ghc-boot-th -optc-DTHREADED_RTS cc-options: -DTHREADED_RTS cpp-options: -DTHREADED_RTS -DGHC_IN_GHCI if !os(windows) build-depends: unix else build-depends: Win32 build-depends: ghc-prim > 0.2 && < 0.6, base >= 4.11 && < 4.14, containers >= 0.5 && < 0.7, bytestring >= 0.9 && < 0.11, binary == 0.8.*, filepath >= 1 && < 1.5, directory >= 1 && < 1.4, array >= 0.1 && < 0.6, deepseq >= 1.4 && < 1.5, pretty == 1.1.*, time >= 1.4 && < 1.10, transformers == 0.5.*, process >= 1 && < 1.7, hpc == 0.6.*, ghc-lib-parser == 0.20200201 build-tools: alex >= 3.1, 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 hs-source-dirs: ghc-lib/stage0/libraries/ghc-boot/build ghc-lib/stage0/compiler/build libraries/template-haskell compiler/specialise compiler/nativeGen compiler/profiling compiler/simplCore compiler/typecheck libraries/ghc-boot compiler/backpack compiler/coreSyn compiler/deSugar compiler/llvmGen compiler/prelude compiler/stranal compiler/iface compiler/utils libraries/ghci compiler/ghci compiler/main compiler/. compiler autogen-modules: Paths_ghc_lib reexported-modules: Annotations, ApiAnnotation, Avail, Bag, BasicTypes, BinFingerprint, Binary, BkpSyn, BooleanFormula, BufWrite, ByteCodeTypes, Class, CliOption, CmdLineParser, CoAxiom, Coercion, ConLike, Config, Constants, Constraint, CoreArity, CoreFVs, CoreMap, CoreMonad, CoreOpt, CoreSeq, CoreStats, CoreSubst, CoreSyn, CoreTidy, CoreUnfold, CoreUtils, CostCentre, CostCentreState, Ctype, DataCon, Demand, Digraph, DriverPhases, DynFlags, Encoding, EnumSet, ErrUtils, Exception, FV, FamInstEnv, FastFunctions, FastMutInt, FastString, FastStringEnv, FieldLabel, FileCleanup, FileSettings, Fingerprint, FiniteMap, ForeignCall, GHC.BaseDir, 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.Switch, GHC.Cmm.Type, GHC.CoreToIface, GHC.Exts.Heap, GHC.Exts.Heap.ClosureTypes, GHC.Exts.Heap.Closures, GHC.Exts.Heap.Constants, GHC.Exts.Heap.InfoTable, GHC.Exts.Heap.InfoTable.Types, GHC.Exts.Heap.InfoTableProf, GHC.Exts.Heap.Utils, GHC.ForeignSrcLang, GHC.ForeignSrcLang.Type, GHC.Hs, GHC.Hs.Binds, GHC.Hs.Decls, GHC.Hs.Doc, GHC.Hs.Expr, GHC.Hs.Extension, GHC.Hs.ImpExp, GHC.Hs.Instances, GHC.Hs.Lit, GHC.Hs.Pat, GHC.Hs.PlaceHolder, GHC.Hs.Types, GHC.Hs.Utils, GHC.HsToCore.PmCheck.Types, GHC.Iface.Syntax, GHC.Iface.Type, GHC.LanguageExtensions, GHC.LanguageExtensions.Type, GHC.Lexeme, GHC.PackageDb, GHC.Platform, GHC.Platform.ARM, GHC.Platform.ARM64, GHC.Platform.NoRegs, GHC.Platform.PPC, GHC.Platform.Regs, GHC.Platform.S390X, GHC.Platform.SPARC, GHC.Platform.X86, GHC.Platform.X86_64, GHC.Runtime.Layout, GHC.Serialized, GHC.Stg.Syntax, GHC.Types.RepType, GHC.UniqueSubdir, GHC.Version, GHCi.BreakArray, GHCi.FFI, GHCi.Message, GHCi.RemoteTypes, GHCi.TH.Binary, GhcMonad, GhcNameVersion, GhcPrelude, HaddockUtils, HeaderInfo, Hooks, HscTypes, IOEnv, Id, IdInfo, InstEnv, InteractiveEvalTypes, Json, KnownUniques, 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, Lexeme, Lexer, LinkerTypes, ListSetOps, Literal, Maybes, MkCore, MkId, Module, MonadUtils, Name, NameCache, NameEnv, NameSet, OccName, OccurAnal, OptCoercion, OrdList, Outputable, Packages, Pair, Panic, Parser, PatSyn, PipelineMonad, PlainPanic, PlatformConstants, Plugins, PprColour, PprCore, Predicate, PrelNames, PrelRules, Pretty, PrimOp, RdrHsSyn, RdrName, Reg, RegClass, Rules, Settings, SizedSeq, SrcLoc, Stream, StringBuffer, SysTools.BaseDir, SysTools.Terminal, TcEvidence, TcHoleFitTypes, TcOrigin, TcRnTypes, TcType, ToolSettings, TrieMap, TyCoFVs, TyCoPpr, TyCoRep, TyCoSubst, TyCoTidy, TyCon, Type, TysPrim, TysWiredIn, Unify, UniqDFM, UniqDSet, UniqFM, UniqSet, UniqSupply, Unique, UnitInfo, Util, Var, VarEnv, VarSet exposed-modules: Paths_ghc_lib Ar AsmCodeGen AsmUtils BlockLayout BuildTyCl ByteCodeAsm ByteCodeGen ByteCodeInstr ByteCodeItbls ByteCodeLink CFG CPrim CSE CallArity ClsInst CodeOutput CoreLint Coverage Debugger Desugar DmdAnal Dominators DriverBkp DriverMkDepend DriverPipeline DsArrows DsBinds DsCCall DsExpr DsForeign DsGRHSs DsListComp DsMeta DsMonad DsUsage DsUtils Dwarf Dwarf.Constants Dwarf.Types DynamicLoading Elf Exitify ExtractDocs FamInst Finder FlagChecker FloatIn FloatOut Format FunDeps GHC GHC.Cmm.CallConv GHC.Cmm.CommonBlockElim GHC.Cmm.ContFlowOpt GHC.Cmm.Dataflow GHC.Cmm.DebugBlock GHC.Cmm.Graph GHC.Cmm.Info GHC.Cmm.Info.Build GHC.Cmm.LayoutStack GHC.Cmm.Lexer GHC.Cmm.Lint GHC.Cmm.Liveness GHC.Cmm.Monad GHC.Cmm.Opt GHC.Cmm.Parser GHC.Cmm.Pipeline GHC.Cmm.Ppr GHC.Cmm.Ppr.Decl GHC.Cmm.Ppr.Expr GHC.Cmm.ProcPoint GHC.Cmm.Sink GHC.Cmm.Switch.Implement GHC.Cmm.Utils GHC.CmmToC GHC.CoreToStg GHC.CoreToStg.Prep GHC.Data.Bitmap GHC.HandleEncoding GHC.Hs.Dump GHC.HsToCore.PmCheck GHC.HsToCore.PmCheck.Oracle GHC.HsToCore.PmCheck.Ppr GHC.Iface.Binary GHC.Iface.Env 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.Rename GHC.Iface.Tidy GHC.Iface.Utils GHC.IfaceToCore GHC.Platform.Host GHC.Rename.Binds GHC.Rename.Doc GHC.Rename.Env GHC.Rename.Expr GHC.Rename.Fixity GHC.Rename.Names GHC.Rename.Pat GHC.Rename.Source GHC.Rename.Splice GHC.Rename.Types GHC.Rename.Unbound GHC.Rename.Utils GHC.Settings GHC.Stg.CSE GHC.Stg.FVs GHC.Stg.Lift GHC.Stg.Lift.Analysis GHC.Stg.Lift.Monad GHC.Stg.Lint GHC.Stg.Pipeline GHC.Stg.Stats GHC.Stg.Subst GHC.Stg.Unarise 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.Layout GHC.StgToCmm.Monad GHC.StgToCmm.Prim GHC.StgToCmm.Prof GHC.StgToCmm.Ticky GHC.StgToCmm.Utils GHC.ThToHs GHCi GHCi.BinaryArray GHCi.CreateBCO GHCi.InfoTable GHCi.ObjLink GHCi.ResolvedBCO GHCi.Run GHCi.Signals GHCi.StaticPtrTable GHCi.TH GhcMake GhcPlugins GraphBase GraphColor GraphOps GraphPpr HscMain HscStats Inst Instruction InteractiveEval Language.Haskell.TH.Quote LiberateCase Linker Llvm Llvm.AbsSyn Llvm.MetaData Llvm.PpLlvm Llvm.Types LlvmCodeGen LlvmCodeGen.Base LlvmCodeGen.CodeGen LlvmCodeGen.Data LlvmCodeGen.Ppr LlvmCodeGen.Regs LlvmMangler Match MatchCon MatchLit NCGMonad NameShape PIC PPC.CodeGen PPC.Cond PPC.Instr PPC.Ppr PPC.RegInfo PPC.Regs PprBase PprTyThing PrelInfo ProfInit RegAlloc.Graph.ArchBase RegAlloc.Graph.ArchX86 RegAlloc.Graph.Coalesce RegAlloc.Graph.Main RegAlloc.Graph.Spill RegAlloc.Graph.SpillClean RegAlloc.Graph.SpillCost RegAlloc.Graph.Stats RegAlloc.Graph.TrivColorable RegAlloc.Linear.Base RegAlloc.Linear.FreeRegs RegAlloc.Linear.JoinToTargets RegAlloc.Linear.Main RegAlloc.Linear.PPC.FreeRegs RegAlloc.Linear.SPARC.FreeRegs RegAlloc.Linear.StackMap RegAlloc.Linear.State RegAlloc.Linear.Stats RegAlloc.Linear.X86.FreeRegs RegAlloc.Linear.X86_64.FreeRegs RegAlloc.Liveness RtClosureInspect SAT SPARC.AddrMode SPARC.Base SPARC.CodeGen SPARC.CodeGen.Amode SPARC.CodeGen.Base SPARC.CodeGen.CondCode SPARC.CodeGen.Expand SPARC.CodeGen.Gen32 SPARC.CodeGen.Gen64 SPARC.CodeGen.Sanity SPARC.Cond SPARC.Imm SPARC.Instr SPARC.Ppr SPARC.Regs SPARC.ShortcutJump SPARC.Stack SetLevels SimplCore SimplEnv SimplMonad SimplUtils Simplify SpecConstr Specialise State StaticPtrTable SysTools SysTools.ExtraObj SysTools.Info SysTools.Process SysTools.Settings SysTools.Tasks THNames TargetReg TcAnnotations TcArrows TcBackpack TcBinds TcCanonical TcClassDcl TcDefaults TcDeriv TcDerivInfer TcDerivUtils TcEnv TcErrors TcEvTerm TcExpr TcFlatten TcForeign TcGenDeriv TcGenFunctor TcGenGenerics TcHoleErrors TcHsSyn TcHsType TcInstDcls TcInteract TcMType TcMatches TcPat TcPatSyn TcPluginM TcRnDriver TcRnExports TcRnMonad TcRules TcSMonad TcSigs TcSimplify TcSplice TcTyClsDecls TcTyDecls TcTypeNats TcTypeable TcUnify TcValidity UnVarGraph UniqMap WorkWrap WwLib X86.CodeGen X86.Cond X86.Instr X86.Ppr X86.RegInfo X86.Regs