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

[ bsd3, development, library ] [ Propose Tags ]

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

Modules

[Last Documentation]

  • ApiAnnotation
  • Bag
  • BinFingerprint
  • Binary
  • BooleanFormula
  • BufWrite
  • CliOption
  • Config
  • Constants
  • Constraint
  • Ctype
  • Digraph
  • Encoding
  • EnumSet
  • ErrUtils
  • Exception
  • FV
  • FastFunctions
  • FastMutInt
  • FastString
  • FastStringEnv
  • FileCleanup
  • FileSettings
  • Fingerprint
  • FiniteMap
  • GHC
    • GHC.BaseDir
    • ByteCode
      • GHC.ByteCode.Types
    • GHC.Cmm
      • GHC.Cmm.BlockId
      • GHC.Cmm.CLabel
      • Dataflow
        • 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.Core
      • GHC.Core.Arity
      • 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.Make
      • GHC.Core.Map
      • Op
        • GHC.Core.Op.ConstantFold
        • GHC.Core.Op.Monad
        • GHC.Core.Op.OccurAnal
        • GHC.Core.Op.Tidy
      • GHC.Core.PatSyn
      • GHC.Core.Ppr
      • GHC.Core.Predicate
      • GHC.Core.Rules
      • GHC.Core.Seq
      • GHC.Core.SimpleOpt
      • GHC.Core.Stats
      • GHC.Core.Subst
      • TyCo
        • 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.Type
      • GHC.Core.Unfold
      • GHC.Core.Unify
      • GHC.Core.Utils
    • GHC.CoreToIface
    • Driver
      • Backpack
        • GHC.Driver.Backpack.Syntax
      • GHC.Driver.CmdLine
      • GHC.Driver.Flags
      • GHC.Driver.Hooks
      • GHC.Driver.Monad
      • GHC.Driver.Packages
      • GHC.Driver.Phases
      • Pipeline
        • GHC.Driver.Pipeline.Monad
      • GHC.Driver.Plugins
      • GHC.Driver.Session
      • GHC.Driver.Types
      • GHC.Driver.Ways
    • Exts
      • 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.Dump
      • GHC.Hs.Expr
      • GHC.Hs.Extension
      • GHC.Hs.ImpExp
      • GHC.Hs.Instances
      • GHC.Hs.Lit
      • GHC.Hs.Pat
      • GHC.Hs.Types
      • GHC.Hs.Utils
    • HsToCore
      • PmCheck
        • GHC.HsToCore.PmCheck.Types
    • Iface
      • 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.Reg
        • GHC.Platform.Reg.Class
      • GHC.Platform.Regs
      • GHC.Platform.S390X
      • GHC.Platform.SPARC
      • GHC.Platform.X86
      • GHC.Platform.X86_64
    • Runtime
      • Eval
        • GHC.Runtime.Eval.Types
      • Heap
        • GHC.Runtime.Heap.Layout
      • Interpreter
        • GHC.Runtime.Interpreter.Types
      • Linker
        • GHC.Runtime.Linker.Types
    • GHC.Serialized
    • Stg
      • GHC.Stg.Syntax
    • Types
      • GHC.Types.Annotations
      • GHC.Types.Avail
      • GHC.Types.Basic
      • GHC.Types.CostCentre
        • GHC.Types.CostCentre.State
      • GHC.Types.Cpr
      • GHC.Types.Demand
      • GHC.Types.FieldLabel
      • GHC.Types.ForeignCall
      • GHC.Types.Id
        • GHC.Types.Id.Info
        • GHC.Types.Id.Make
      • GHC.Types.Literal
      • GHC.Types.Module
      • GHC.Types.Name
        • GHC.Types.Name.Cache
        • GHC.Types.Name.Env
        • GHC.Types.Name.Occurrence
        • GHC.Types.Name.Reader
        • GHC.Types.Name.Set
      • GHC.Types.RepType
      • GHC.Types.SrcLoc
      • GHC.Types.Unique
        • GHC.Types.Unique.DFM
        • GHC.Types.Unique.DSet
        • GHC.Types.Unique.FM
        • GHC.Types.Unique.Set
        • GHC.Types.Unique.Supply
      • GHC.Types.Var
        • GHC.Types.Var.Env
        • GHC.Types.Var.Set
    • GHC.UniqueSubdir
    • Utils
      • GHC.Utils.Lexeme
    • GHC.Version
  • GHCi
    • GHCi.BreakArray
    • GHCi.FFI
    • GHCi.Message
    • GHCi.RemoteTypes
    • TH
      • GHCi.TH.Binary
  • GhcNameVersion
  • GhcPrelude
  • HaddockUtils
  • HeaderInfo
  • IOEnv
  • Json
  • KnownUniques
  • Language
    • Haskell
      • 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
  • Lexer
  • ListSetOps
  • Maybes
  • MonadUtils
  • OrdList
  • Outputable
  • Pair
  • Panic
  • Parser
  • PlainPanic
  • PlatformConstants
  • PprColour
  • PrelNames
  • Pretty
  • PrimOp
  • RdrHsSyn
  • Settings
  • SizedSeq
  • Stream
  • StringBuffer
  • SysTools
    • SysTools.BaseDir
    • SysTools.Terminal
  • TcEvidence
  • TcHoleFitTypes
  • TcOrigin
  • TcRnTypes
  • TcType
  • ToolSettings
  • TrieMap
  • TysPrim
  • TysWiredIn
  • UnitInfo
  • Util

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.20190402, 0.20190423, 0.20190516, 0.20190523, 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.8.1.20231009, 9.8.1.20231121, 9.8.2.20240223
Dependencies array (>=0.1 && <0.6), base (>=4.11 && <4.14), binary (>=0.8 && <0.9), bytestring (>=0.9 && <0.11), containers (>=0.5 && <0.7), deepseq (>=1.4 && <1.5), directory (>=1 && <1.4), filepath (>=1 && <1.5), ghc-prim (>0.2 && <0.6), hpc (>=0.6 && <0.7), pretty (>=1.1 && <1.2), process (>=1 && <1.7), time (>=1.4 && <1.10), transformers (>=0.5 && <0.6), 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 2020-04-01T13:33:41Z
Distributions Arch:9.2.8.20230729, Debian:8.10.2.20200808, Fedora:9.4.5.20230430, LTSHaskell:9.6.4.20240109, NixOS:9.6.4.20240109, Stackage:9.8.2.20240223, openSUSE:9.6.4.20240109
Reverse Dependencies 12 direct, 93 indirect [details]
Downloads 82135 total (1396 in the last 30 days)
Rating 1.25 (votes: 1) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs not available [build log]
All reported builds failed as of 2020-04-01 [all 3 reports]