cabal-version: >=1.22
build-type: Simple
name: ghc-lib
version: 8.8.1.20191204
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/generated/ghcautoconf.h
    ghc-lib/generated/ghcplatform.h
    ghc-lib/generated/ghcversion.h
    ghc-lib/generated/DerivedConstants.h
    ghc-lib/generated/GHCConstantsHaskellExports.hs
    ghc-lib/generated/GHCConstantsHaskellType.hs
    ghc-lib/generated/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
    ghc-lib/stage0/compiler/build/ghc_boot_platform.h
    ghc-lib/stage0/compiler/build/Fingerprint.hs
    includes/ghcconfig.h
    includes/MachDeps.h
    includes/stg/MachRegs.h
    includes/CodeGen.Platform.hs
    compiler/HsVersions.h
    compiler/Unique.h
    compiler/nativeGen/NCG.h
    compiler/utils/md5.h
tested-with: GHC==8.8.1, GHC==8.6.5, GHC==8.4.3
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/generated
        ghc-lib/stage0/compiler/build
        compiler
        compiler/utils
    ghc-options: -fobject-code -package=ghc-boot-th -optc-DTHREADED_RTS
    cc-options: -DTHREADED_RTS
    cpp-options: -DSTAGE=2 -DTHREADED_RTS -DGHCI -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 == 8.8.1.20191204
    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/compiler/build
        libraries/template-haskell
        compiler/specialise
        compiler/nativeGen
        compiler/profiling
        compiler/simplCore
        compiler/typecheck
        libraries/ghc-boot
        compiler/backpack
        compiler/simplStg
        compiler/codeGen
        compiler/coreSyn
        compiler/deSugar
        compiler/hieFile
        compiler/llvmGen
        compiler/prelude
        compiler/stranal
        compiler/rename
        compiler/stgSyn
        compiler/hsSyn
        compiler/iface
        compiler/utils
        libraries/ghci
        compiler/ghci
        compiler/main
        compiler/cmm
        compiler
    autogen-modules:
        Paths_ghc_lib
    reexported-modules:
        Annotations,
        ApiAnnotation,
        Avail,
        Bag,
        BasicTypes,
        BinFingerprint,
        Binary,
        BkpSyn,
        BooleanFormula,
        BufWrite,
        ByteCodeTypes,
        Class,
        CmdLineParser,
        CmmType,
        CoAxiom,
        Coercion,
        ConLike,
        Config,
        Constants,
        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,
        Fingerprint,
        FiniteMap,
        ForeignCall,
        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.LanguageExtensions,
        GHC.LanguageExtensions.Type,
        GHC.Lexeme,
        GHC.PackageDb,
        GHC.Serialized,
        GHCi.BreakArray,
        GHCi.FFI,
        GHCi.Message,
        GHCi.RemoteTypes,
        GHCi.TH.Binary,
        GhcMonad,
        GhcPrelude,
        HaddockUtils,
        HeaderInfo,
        Hooks,
        HsBinds,
        HsDecls,
        HsDoc,
        HsExpr,
        HsExtension,
        HsImpExp,
        HsInstances,
        HsLit,
        HsPat,
        HsSyn,
        HsTypes,
        HsUtils,
        HscTypes,
        IOEnv,
        Id,
        IdInfo,
        IfaceSyn,
        IfaceType,
        InstEnv,
        InteractiveEvalTypes,
        Json,
        Kind,
        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,
        ListSetOps,
        Literal,
        Maybes,
        MkCore,
        MkId,
        Module,
        MonadUtils,
        Name,
        NameCache,
        NameEnv,
        NameSet,
        OccName,
        OccurAnal,
        OptCoercion,
        OrdList,
        Outputable,
        PackageConfig,
        Packages,
        Pair,
        Panic,
        Parser,
        PatSyn,
        PipelineMonad,
        PlaceHolder,
        PlainPanic,
        Platform,
        PlatformConstants,
        Plugins,
        PmExpr,
        PprColour,
        PprCore,
        PrelNames,
        PrelRules,
        Pretty,
        PrimOp,
        RdrHsSyn,
        RdrName,
        RepType,
        Rules,
        SizedSeq,
        SrcLoc,
        StringBuffer,
        SysTools.BaseDir,
        SysTools.Terminal,
        TcEvidence,
        TcRnTypes,
        TcType,
        ToIface,
        TrieMap,
        TyCoRep,
        TyCon,
        Type,
        TysPrim,
        TysWiredIn,
        Unify,
        UniqDFM,
        UniqDSet,
        UniqFM,
        UniqSet,
        UniqSupply,
        Unique,
        Util,
        Var,
        VarEnv,
        VarSet
    exposed-modules:
        Paths_ghc_lib
        Ar
        AsmCodeGen
        AsmUtils
        BinIface
        Bitmap
        BlockId
        BlockLayout
        BuildTyCl
        ByteCodeAsm
        ByteCodeGen
        ByteCodeInstr
        ByteCodeItbls
        ByteCodeLink
        CFG
        CLabel
        CPrim
        CSE
        CallArity
        CgUtils
        Check
        ClsInst
        Cmm
        CmmBuildInfoTables
        CmmCallConv
        CmmCommonBlockElim
        CmmContFlowOpt
        CmmExpr
        CmmImplementSwitchPlans
        CmmInfo
        CmmLayoutStack
        CmmLex
        CmmLint
        CmmLive
        CmmMachOp
        CmmMonad
        CmmNode
        CmmOpt
        CmmParse
        CmmPipeline
        CmmProcPoint
        CmmSink
        CmmSwitch
        CmmUtils
        CodeGen.Platform
        CodeGen.Platform.ARM
        CodeGen.Platform.ARM64
        CodeGen.Platform.NoRegs
        CodeGen.Platform.PPC
        CodeGen.Platform.SPARC
        CodeGen.Platform.X86
        CodeGen.Platform.X86_64
        CodeOutput
        Convert
        CoreLint
        CorePrep
        CoreToStg
        Coverage
        Debug
        Debugger
        Desugar
        DmdAnal
        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.HandleEncoding
        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
        HieAst
        HieBin
        HieDebug
        HieTypes
        HieUtils
        Hoopl.Block
        Hoopl.Collections
        Hoopl.Dataflow
        Hoopl.Graph
        Hoopl.Label
        HsDumpAst
        HscMain
        HscStats
        IfaceEnv
        Inst
        Instruction
        InteractiveEval
        Language.Haskell.TH.Quote
        LiberateCase
        Linker
        ListT
        Llvm
        Llvm.AbsSyn
        Llvm.MetaData
        Llvm.PpLlvm
        Llvm.Types
        LlvmCodeGen
        LlvmCodeGen.Base
        LlvmCodeGen.CodeGen
        LlvmCodeGen.Data
        LlvmCodeGen.Ppr
        LlvmCodeGen.Regs
        LlvmMangler
        LoadIface
        Match
        MatchCon
        MatchLit
        MkGraph
        MkIface
        NCGMonad
        NameShape
        PIC
        PPC.CodeGen
        PPC.Cond
        PPC.Instr
        PPC.Ppr
        PPC.RegInfo
        PPC.Regs
        PprBase
        PprC
        PprCmm
        PprCmmDecl
        PprCmmExpr
        PprTyThing
        PrelInfo
        ProfInit
        Reg
        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
        RegClass
        RnBinds
        RnEnv
        RnExpr
        RnFixity
        RnHsDoc
        RnModIface
        RnNames
        RnPat
        RnSource
        RnSplice
        RnTypes
        RnUnbound
        RnUtils
        RtClosureInspect
        SAT
        SMRep
        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
        SimplStg
        SimplUtils
        Simplify
        SpecConstr
        Specialise
        State
        StaticPtrTable
        StgCmm
        StgCmmArgRep
        StgCmmBind
        StgCmmClosure
        StgCmmCon
        StgCmmEnv
        StgCmmExpr
        StgCmmExtCode
        StgCmmForeign
        StgCmmHeap
        StgCmmHpc
        StgCmmLayout
        StgCmmMonad
        StgCmmPrim
        StgCmmProf
        StgCmmTicky
        StgCmmUtils
        StgCse
        StgFVs
        StgLiftLams
        StgLiftLams.Analysis
        StgLiftLams.LiftM
        StgLiftLams.Transformation
        StgLint
        StgStats
        StgSubst
        StgSyn
        Stream
        SysTools
        SysTools.ExtraObj
        SysTools.Info
        SysTools.Process
        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
        TcIface
        TcInstDcls
        TcInteract
        TcMType
        TcMatches
        TcPat
        TcPatSyn
        TcPluginM
        TcRnDriver
        TcRnExports
        TcRnMonad
        TcRules
        TcSMonad
        TcSigs
        TcSimplify
        TcSplice
        TcTyClsDecls
        TcTyDecls
        TcTypeNats
        TcTypeable
        TcTypeableValidity
        TcUnify
        TcValidity
        TidyPgm
        TmOracle
        UnVarGraph
        UnariseStg
        UniqMap
        WorkWrap
        WwLib
        X86.CodeGen
        X86.Cond
        X86.Instr
        X86.Ppr
        X86.RegInfo
        X86.Regs