Outputable Fingerprint # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Int32 # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Int64 # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Word16 # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Word32 # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Word64 # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable IntSet # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable CoreModule # | |
Instance detailsDefined in GHC |
Outputable PrimCall # | |
Instance detailsDefined in GHC.Builtin.PrimOps |
Outputable PrimOp # | |
Instance detailsDefined in GHC.Builtin.PrimOps |
Outputable BCInstr # | |
Instance detailsDefined in GHC.ByteCode.Instr |
Outputable LocalLabel # | |
Instance detailsDefined in GHC.ByteCode.Instr |
Outputable ByteOff # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable CgBreakInfo # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable CompiledByteCode # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable RegBitmap # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable TupleInfo # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable UnlinkedBCO # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable WordOff # | |
Instance detailsDefined in GHC.ByteCode.Types |
Outputable CmmStackInfo # | |
Instance detailsDefined in GHC.Cmm.Ppr |
Outputable CmmStatic # | |
Instance detailsDefined in GHC.Cmm |
Outputable CLabel # | |
Instance detailsDefined in GHC.Cmm.CLabel |
Outputable ConInfoTableLocation # | |
Instance detailsDefined in GHC.Cmm.CLabel |
Outputable ForeignLabelSource # | |
Instance detailsDefined in GHC.Cmm.CLabel |
Outputable ParamLocation # | |
Instance detailsDefined in GHC.Cmm.CallConv |
Outputable Label # | |
Instance detailsDefined in GHC.Cmm.Dataflow.Label |
Outputable LabelSet # | |
Instance detailsDefined in GHC.Cmm.Dataflow.Label |
Outputable Area # | |
Instance detailsDefined in GHC.Cmm.Ppr.Expr |
Outputable CmmLit # | |
Instance detailsDefined in GHC.Cmm.Expr |
Outputable CmmReg # | |
Instance detailsDefined in GHC.Cmm.Ppr.Expr |
Outputable GlobalReg # | |
Instance detailsDefined in GHC.Cmm.Ppr.Expr |
Outputable LocalReg # | |
Instance detailsDefined in GHC.Cmm.Ppr.Expr |
Outputable CmmReturnInfo # | |
Instance detailsDefined in GHC.Cmm.Ppr |
Outputable CmmTickScope # | |
Instance detailsDefined in GHC.Cmm.Node |
Outputable Convention # | |
Instance detailsDefined in GHC.Cmm.Ppr |
Outputable ForeignConvention # | |
Instance detailsDefined in GHC.Cmm.Ppr |
Outputable Status # | |
Instance detailsDefined in GHC.Cmm.ProcPoint |
Outputable CmmType # | |
Instance detailsDefined in GHC.Cmm.Type |
Outputable ForeignHint # | |
Instance detailsDefined in GHC.Cmm.Ppr.Decl |
Outputable Width # | |
Instance detailsDefined in GHC.Cmm.Type |
Outputable Instr # | |
Instance detailsDefined in GHC.CmmToAsm.AArch64.Ppr |
Outputable JumpDest # | |
Instance detailsDefined in GHC.CmmToAsm.AArch64.RegInfo |
Outputable CfgEdge # | |
Instance detailsDefined in GHC.CmmToAsm.CFG |
Outputable EdgeInfo # | |
Instance detailsDefined in GHC.CmmToAsm.CFG |
Outputable EdgeWeight # | |
Instance detailsDefined in GHC.CmmToAsm.CFG |
Outputable RegUsage # | Get the registers that are being used by this instruction.
regUsage doesn't need to do any trickery for jumps and such.
Just state precisely the regs read and written by that insn.
The consequences of control flow transfers, as far as register
allocation goes, are taken care of by the register allocator. RegUsage = RU [regs] [regs] |
Instance detailsDefined in GHC.CmmToAsm.AArch64.Instr |
Outputable JumpDest # | |
Instance detailsDefined in GHC.CmmToAsm.PPC.RegInfo |
Outputable SpillStats # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Graph.Spill |
Outputable FreeRegs # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.AArch64 |
Outputable Loc # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.Base |
Outputable FreeRegs # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.PPC |
Outputable FreeRegs # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.SPARC |
Outputable FreeRegs # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.X86 |
Outputable FreeRegs # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Linear.X86_64 |
Outputable JumpDest # | |
Instance detailsDefined in GHC.CmmToAsm.SPARC.ShortcutJump |
Outputable JumpDest # | |
Instance detailsDefined in GHC.CmmToAsm.X86.Instr |
Outputable AltCon # | |
Instance detailsDefined in GHC.Core |
Outputable CoreRule # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable Unfolding # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable UnfoldingGuidance # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable UnfoldingSource # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable Class # | |
Instance detailsDefined in GHC.Core.Class |
Outputable LiftingContext # | |
Instance detailsDefined in GHC.Core.Coercion |
Outputable CoAxBranch # | |
Instance detailsDefined in GHC.Core.Coercion.Axiom |
Outputable CoAxiomRule # | |
Instance detailsDefined in GHC.Core.Coercion.Axiom |
Outputable Role # | |
Instance detailsDefined in GHC.Core.Coercion.Axiom |
Outputable ConLike # | |
Instance detailsDefined in GHC.Core.ConLike |
Outputable DataCon # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable EqSpec # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable HsImplBang # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable HsSrcBang # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable SrcStrictness # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable SrcUnpackedness # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable StrictnessMark # | |
Instance detailsDefined in GHC.Core.DataCon |
Outputable FamInst # | |
Instance detailsDefined in GHC.Core.FamInstEnv |
Outputable FamInstMatch # | |
Instance detailsDefined in GHC.Core.FamInstEnv |
Outputable ClsInst # | |
Instance detailsDefined in GHC.Core.InstEnv |
Outputable FloatBind # | |
Instance detailsDefined in GHC.Core.Make |
Outputable IsSubmult # | |
Instance detailsDefined in GHC.Core.Multiplicity |
Outputable ArityType # | This is the BNF of the generated output: @
We format
AT [o1,..,on] topDiv as o1..on.T and
AT [o1,..,on] botDiv as o1..on.⊥, respectively.
More concretely, AT [NOI,OS,OS] topDiv is formatted as ?11.T.
If the one-shot info is empty, we omit the leading .@. |
Instance detailsDefined in GHC.Core.Opt.Arity |
Outputable CallerCcFilter # | |
Instance detailsDefined in GHC.Core.Opt.CallerCC |
Outputable NamePattern # | |
Instance detailsDefined in GHC.Core.Opt.CallerCC |
Outputable CoreToDo # | |
Instance detailsDefined in GHC.Core.Opt.Monad |
Outputable FloatOutSwitches # | |
Instance detailsDefined in GHC.Core.Opt.Monad |
Outputable SimplMode # | |
Instance detailsDefined in GHC.Core.Opt.Monad |
Outputable Tick # | |
Instance detailsDefined in GHC.Core.Opt.Monad |
Outputable FloatSpec # | |
Instance detailsDefined in GHC.Core.Opt.SetLevels |
Outputable Level # | |
Instance detailsDefined in GHC.Core.Opt.SetLevels |
Outputable LetFloats # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Env |
Outputable SimplFloats # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Env |
Outputable SimplSR # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Env |
Outputable ArgInfo # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Utils |
Outputable ArgSpec # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Utils |
Outputable DupFlag # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Utils |
Outputable SimplCont # | |
Instance detailsDefined in GHC.Core.Opt.Simplify.Utils |
Outputable PatSyn # | |
Instance detailsDefined in GHC.Core.PatSyn |
Outputable EqRel # | |
Instance detailsDefined in GHC.Core.Predicate |
Outputable CoreStats # | |
Instance detailsDefined in GHC.Core.Stats |
Outputable Subst # | |
Instance detailsDefined in GHC.Core.Subst |
Outputable Coercion # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable CoercionHole # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable MCoercion # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable TyCoBinder # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable TyLit # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable Type # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable UnivCoProvenance # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable TCvSubst # | |
Instance detailsDefined in GHC.Core.TyCo.Subst |
Outputable AlgTyConFlav # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable FamTyConFlav # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable PrimElemRep # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable PrimRep # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable TyCon # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable TyConBndrVis # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable TyConFlavour # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable RecTcChecker # | |
Instance detailsDefined in GHC.Core.TyCon.RecWalk |
Outputable ArgSummary # | |
Instance detailsDefined in GHC.Core.Unfold |
Outputable CallCtxt # | |
Instance detailsDefined in GHC.Core.Unfold |
Outputable MaybeApartReason # | |
Instance detailsDefined in GHC.Core.Unify |
Outputable Usage # | |
Instance detailsDefined in GHC.Core.UsageEnv |
Outputable UsageEnv # | |
Instance detailsDefined in GHC.Core.UsageEnv |
Outputable FastString # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable LexicalFastString # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable NonDetFastString # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable EdgeType # | |
Instance detailsDefined in GHC.Data.Graph.Directed |
Outputable UnVarGraph # | |
Instance detailsDefined in GHC.Data.Graph.UnVar |
Outputable UnVarSet # | |
Instance detailsDefined in GHC.Data.Graph.UnVar |
Outputable HsComponentId # | |
Instance detailsDefined in GHC.Driver.Backpack.Syntax |
Outputable WarnReason # | |
Instance detailsDefined in GHC.Driver.CmdLine |
Outputable Language # | |
Instance detailsDefined in GHC.Driver.Flags |
Outputable WarnReason # | |
Instance detailsDefined in GHC.Driver.Flags |
Outputable Phase # | |
Instance detailsDefined in GHC.Driver.Phases |
Outputable PhasePlus # | |
Instance detailsDefined in GHC.Driver.Pipeline.Monad |
Outputable PluginRecompile # | |
Instance detailsDefined in GHC.Driver.Plugins |
Outputable GhcMode # | |
Instance detailsDefined in GHC.Driver.Session |
Outputable ModRenaming # | |
Instance detailsDefined in GHC.Driver.Session |
Outputable PackageArg # | |
Instance detailsDefined in GHC.Driver.Session |
Outputable PackageFlag # | |
Instance detailsDefined in GHC.Driver.Session |
Outputable HsModule # | |
Instance detailsDefined in GHC.Hs |
Outputable XViaStrategyPs # | |
Instance detailsDefined in GHC.Hs.Decls |
Outputable ArgDocMap # | |
Instance detailsDefined in GHC.Hs.Doc |
Outputable DeclDocMap # | |
Instance detailsDefined in GHC.Hs.Doc |
Outputable HsDocString # | |
Instance detailsDefined in GHC.Hs.Doc |
Outputable GrhsAnn # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable PendingRnSplice # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable PendingTcSplice # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable SyntaxExprRn # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable SyntaxExprTc # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable DsMatchContext # | |
Instance detailsDefined in GHC.HsToCore.Monad |
Outputable EquationInfo # | |
Instance detailsDefined in GHC.HsToCore.Monad |
Outputable PhiCt # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver |
Outputable BotInfo # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable Nabla # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable Nablas # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmAltCon # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmAltConApp # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmAltConSet # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmEquality # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmLit # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable PmLitValue # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable ResidualCompleteMatches # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable TmState # | Not user-facing. |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable TyState # | Not user-facing. |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable VarInfo # | Not user-facing. |
Instance detailsDefined in GHC.HsToCore.Pmc.Solver.Types |
Outputable GrdVec # | Format LYG guards as | True <- x, let x = 42, !z |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable PmEmptyCase # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable PmGrd # | Should not be user-facing. |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable Precision # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable RedSets # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable SrcInfo # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable BindType # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable ContextInfo # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable DeclType # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable EvBindDeps # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable EvVarSource # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable HieName # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable IEType # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable NodeAnnotation # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable NodeOrigin # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable RecFieldContext # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable Scope # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable TyVarScope # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable IfaceAT # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceAnnotation # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceClassOp # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceClsInst # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceCompleteMatch # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceConAlt # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceDecl # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceExpr # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceFamInst # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceIdDetails # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceInfoItem # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceJoinInfo # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceLFInfo # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceRule # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceTyConParent # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceUnfolding # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable ShowHowMuch # | |
Instance detailsDefined in GHC.Iface.Syntax |
Outputable IfaceAppArgs # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceBndr # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceCoercion # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceOneShot # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceTyCon # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceTyConInfo # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceTyConSort # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceTyLit # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable IfaceType # | |
Instance detailsDefined in GHC.Iface.Type |
Outputable Linkable # | |
Instance detailsDefined in GHC.Linker.Types |
Outputable SptEntry # | |
Instance detailsDefined in GHC.Linker.Types |
Outputable Unlinked # | |
Instance detailsDefined in GHC.Linker.Types |
Outputable MetaId # | |
Instance detailsDefined in GHC.Llvm.MetaData |
Outputable LlvmCallConvention # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmCastOp # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmCmpOp # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmFuncAttr # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmFunctionDecl # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmLinkageType # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmMachOp # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmParamAttr # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable LlvmType # | |
Instance detailsDefined in GHC.Llvm.Types |
Outputable AddEpAnn # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable Anchor # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnchorOperation # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnContext # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnKeywordId # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnList # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnListItem # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnPragma # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable AnnSortKey # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable DeltaPos # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable EpAnnComments # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable EpaComment # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable EpaLocation # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable IsUnicodeSyntax # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable NameAdornment # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable NameAnn # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable TrailingAnn # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable Token # | |
Instance detailsDefined in GHC.Parser.Lexer |
Outputable DataConBuilder # | |
Instance detailsDefined in GHC.Parser.Types |
Outputable RealReg # | |
Instance detailsDefined in GHC.Platform.Reg |
Outputable Reg # | Print a reg in a generic manner
If you want the architecture specific names, then use the pprReg
function from the appropriate Ppr module. |
Instance detailsDefined in GHC.Platform.Reg |
Outputable VirtualReg # | |
Instance detailsDefined in GHC.Platform.Reg |
Outputable RegClass # | |
Instance detailsDefined in GHC.Platform.Reg.Class |
Outputable ChildLookupResult # | |
Instance detailsDefined in GHC.Rename.Env |
Outputable HsSigCtxt # | |
Instance detailsDefined in GHC.Rename.Env |
Outputable WarnUnusedForalls # | |
Instance detailsDefined in GHC.Rename.HsType |
Outputable InteractiveImport # | |
Instance detailsDefined in GHC.Runtime.Context |
Outputable GetDocsFailure # | |
Instance detailsDefined in GHC.Runtime.Eval |
Outputable Term # | |
Instance detailsDefined in GHC.Runtime.Heap.Inspect |
Outputable ClosureTypeInfo # | |
Instance detailsDefined in GHC.Runtime.Heap.Layout |
Outputable SMRep # | |
Instance detailsDefined in GHC.Runtime.Heap.Layout |
Outputable StgHalfWord # | |
Instance detailsDefined in GHC.Runtime.Heap.Layout |
Outputable StgWord # | |
Instance detailsDefined in GHC.Runtime.Heap.Layout |
Outputable BinderInfo # | |
Instance detailsDefined in GHC.Stg.Lift.Analysis |
Outputable Skeleton # | |
Instance detailsDefined in GHC.Stg.Lift.Analysis |
Outputable FloatLang # | |
Instance detailsDefined in GHC.Stg.Lift.Monad |
Outputable AltType # | |
Instance detailsDefined in GHC.Stg.Syntax |
Outputable ConstructorNumber # | |
Instance detailsDefined in GHC.Stg.Syntax |
Outputable NoExtFieldSilent # | |
Instance detailsDefined in GHC.Stg.Syntax |
Outputable StgArg # | |
Instance detailsDefined in GHC.Stg.Syntax |
Outputable UpdateFlag # | |
Instance detailsDefined in GHC.Stg.Syntax |
Outputable ArgRep # | |
Instance detailsDefined in GHC.StgToCmm.ArgRep |
Outputable Sequel # | |
Instance detailsDefined in GHC.StgToCmm.Monad |
Outputable ArgDescr # | |
Instance detailsDefined in GHC.StgToCmm.Types |
Outputable LambdaFormInfo # | |
Instance detailsDefined in GHC.StgToCmm.Types |
Outputable StandardFormInfo # | |
Instance detailsDefined in GHC.StgToCmm.Types |
Outputable DerivContext # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable DerivEnv # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable DerivInstTys # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable DerivSpecMechanism # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable PredOrigin # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable ThetaOrigin # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
Outputable HoleFit # | |
Instance detailsDefined in GHC.Tc.Errors.Hole.FitTypes |
Outputable HoleFitCandidate # | |
Instance detailsDefined in GHC.Tc.Errors.Hole.FitTypes |
Outputable TypedHole # | |
Instance detailsDefined in GHC.Tc.Errors.Hole.FitTypes |
Outputable AppCtxt # | |
Instance detailsDefined in GHC.Tc.Gen.Head |
Outputable HoleMode # | |
Instance detailsDefined in GHC.Tc.Gen.HsType |
Outputable SAKS_or_CUSK # | |
Instance detailsDefined in GHC.Tc.Gen.HsType |
Outputable LetBndrSpec # | |
Instance detailsDefined in GHC.Tc.Gen.Pat |
Outputable ClsInstResult # | |
Instance detailsDefined in GHC.Tc.Instance.Class |
Outputable InstanceWhat # | |
Instance detailsDefined in GHC.Tc.Instance.Class |
Outputable InferMode # | |
Instance detailsDefined in GHC.Tc.Solver |
Outputable EqualCtList # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Outputable InertCans # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Outputable InertSet # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Outputable TouchabilityTestResult # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Outputable WorkList # | |
Instance detailsDefined in GHC.Tc.Solver.Monad |
Outputable IdBindingInfo # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable PromotionErr # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcBinder # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcIdSigInfo # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcIdSigInst # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcPatSynInfo # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcSigInfo # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable TcTyThing # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable ThStage # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable WhereFrom # | |
Instance detailsDefined in GHC.Tc.Types |
Outputable CanEqLHS # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable CheckTyEqResult # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable Ct # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable CtEvidence # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable CtFlavour # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable CtIrredReason # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable HasGivenEqs # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable Hole # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable HoleSort # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable ImplicStatus # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable Implication # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable QCInst # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable SubGoalDepth # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable TcEvDest # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable WantedConstraints # | |
Instance detailsDefined in GHC.Tc.Types.Constraint |
Outputable EvBind # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable EvBindMap # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable EvBindsVar # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable EvCallStack # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable EvTerm # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable EvTypeable # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable HoleExprRef # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable HsWrapper # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable TcEvBinds # | |
Instance detailsDefined in GHC.Tc.Types.Evidence |
Outputable CtOrigin # | |
Instance detailsDefined in GHC.Tc.Types.Origin |
Outputable SkolemInfo # | |
Instance detailsDefined in GHC.Tc.Types.Origin |
Outputable IsExtraConstraint # | |
Instance detailsDefined in GHC.Tc.Utils.Monad |
Outputable CandidatesQTvs # | |
Instance detailsDefined in GHC.Tc.Utils.TcMType |
Outputable ExpType # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable InferResult # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable MetaDetails # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable MetaInfo # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable TcLevel # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable TcTyVarDetails # | |
Instance detailsDefined in GHC.Tc.Utils.TcType |
Outputable ZonkEnv # | |
Instance detailsDefined in GHC.Tc.Utils.Zonk |
Outputable Rank # | |
Instance detailsDefined in GHC.Tc.Validity |
Outputable Annotation # | |
Instance detailsDefined in GHC.Types.Annotations |
Outputable AvailInfo # | |
Instance detailsDefined in GHC.Types.Avail |
Outputable GreName # | |
Instance detailsDefined in GHC.Types.Avail |
Outputable Activation # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable Alignment # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable Boxity # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable CompilerPhase # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable FunctionOrData # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable InlinePragma # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable InlineSpec # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable IntWithInf # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable LeftOrRight # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable OccInfo # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable OneShotInfo # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable Origin # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable OverlapFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable OverlapMode # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable PromotionFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable RecFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable RuleMatchInfo # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable SuccessFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable SwapFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable TailCallInfo # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable TopLevelFlag # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable TupleSort # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable TypeOrKind # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable CompleteMatch # | |
Instance detailsDefined in GHC.Types.CompleteMatch |
Outputable CostCentre # | |
Instance detailsDefined in GHC.Types.CostCentre |
Outputable CostCentreStack # | |
Instance detailsDefined in GHC.Types.CostCentre |
Outputable Cpr # | BNF:
```
cpr ::= '' -- TopCpr
| n -- FlatConCpr n
| n '(' cpr1 ',' cpr2 ',' ... ')' -- ConCpr n [cpr1,cpr2,...]
| b -- BotCpr
```
Examples:
* `f x = f x` has denotation b
* `1(1,)` is a valid (nested) Cpr denotation for `(I# 42#, f 42)`. |
Instance detailsDefined in GHC.Types.Cpr |
Outputable CprSig # | Only print the CPR result |
Instance detailsDefined in GHC.Types.Cpr |
Outputable CprType # | |
Instance detailsDefined in GHC.Types.Cpr |
Outputable Card # | See Note [Demand notation]
Current syntax was discussed in #19016. |
Instance detailsDefined in GHC.Types.Demand |
Outputable Demand # | See Note [Demand notation] |
Instance detailsDefined in GHC.Types.Demand |
Outputable Divergence # | |
Instance detailsDefined in GHC.Types.Demand |
Outputable DmdType # | |
Instance detailsDefined in GHC.Types.Demand |
Outputable StrictSig # | |
Instance detailsDefined in GHC.Types.Demand |
Outputable SubDemand # | See Note [Demand notation] |
Instance detailsDefined in GHC.Types.Demand |
Outputable TypeShape # | |
Instance detailsDefined in GHC.Types.Demand |
Outputable DuplicateRecordFields # | |
Instance detailsDefined in GHC.Types.FieldLabel |
Outputable FieldLabel # | |
Instance detailsDefined in GHC.Types.FieldLabel |
Outputable FieldSelectors # | |
Instance detailsDefined in GHC.Types.FieldLabel |
Outputable Fixity # | |
Instance detailsDefined in GHC.Types.Fixity |
Outputable FixityDirection # | |
Instance detailsDefined in GHC.Types.Fixity |
Outputable LexicalFixity # | |
Instance detailsDefined in GHC.Types.Fixity |
Outputable FixItem # | |
Instance detailsDefined in GHC.Types.Fixity.Env |
Outputable CCallConv # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable CCallSpec # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable CExportSpec # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable CType # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable ForeignCall # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable Header # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable Safety # | |
Instance detailsDefined in GHC.Types.ForeignCall |
Outputable CafInfo # | |
Instance detailsDefined in GHC.Types.Id.Info |
Outputable IdDetails # | |
Instance detailsDefined in GHC.Types.Id.Info |
Outputable IdInfo # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable LevityInfo # | |
Instance detailsDefined in GHC.Types.Id.Info |
Outputable RecSelParent # | |
Instance detailsDefined in GHC.Types.Id.Info |
Outputable TickBoxOp # | |
Instance detailsDefined in GHC.Types.Id.Info |
Outputable Literal # | |
Instance detailsDefined in GHC.Types.Literal |
Outputable Name # | |
Instance detailsDefined in GHC.Types.Name |
Outputable OccName # | |
Instance detailsDefined in GHC.Types.Name.Occurrence |
Outputable GlobalRdrElt # | |
Instance detailsDefined in GHC.Types.Name.Reader |
Outputable ImportSpec # | |
Instance detailsDefined in GHC.Types.Name.Reader |
Outputable LocalRdrEnv # | |
Instance detailsDefined in GHC.Types.Name.Reader |
Outputable Parent # | |
Instance detailsDefined in GHC.Types.Name.Reader |
Outputable RdrName # | |
Instance detailsDefined in GHC.Types.Name.Reader |
Outputable SlotTy # | |
Instance detailsDefined in GHC.Types.RepType |
Outputable IfaceTrustInfo # | |
Instance detailsDefined in GHC.Types.SafeHaskell |
Outputable SafeHaskellMode # | |
Instance detailsDefined in GHC.Types.SafeHaskell |
Outputable FractionalLit # | |
Instance detailsDefined in GHC.Types.SourceText |
Outputable IntegralLit # | |
Instance detailsDefined in GHC.Types.SourceText |
Outputable SourceText # | |
Instance detailsDefined in GHC.Types.SourceText |
Outputable StringLiteral # | |
Instance detailsDefined in GHC.Types.SourceText |
Outputable RealSrcLoc # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable RealSrcSpan # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable SrcLoc # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable SrcSpan # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable UnhelpfulSpanReason # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable Target # | |
Instance detailsDefined in GHC.Types.Target |
Outputable TargetId # | |
Instance detailsDefined in GHC.Types.Target |
Outputable TyThing # | |
Instance detailsDefined in GHC.Types.TyThing |
Outputable Unique # | |
Instance detailsDefined in GHC.Types.Unique |
Outputable AnonArgFlag # | |
Instance detailsDefined in GHC.Types.Var |
Outputable ArgFlag # | |
Instance detailsDefined in GHC.Types.Var |
Outputable Var # | |
Instance detailsDefined in GHC.Types.Var |
Outputable InScopeSet # | |
Instance detailsDefined in GHC.Types.Var.Env |
Outputable PackageId # | |
Instance detailsDefined in GHC.Unit.Info |
Outputable PackageName # | |
Instance detailsDefined in GHC.Unit.Info |
Outputable ModuleGraphNode # | |
Instance detailsDefined in GHC.Unit.Module.Graph |
Outputable ModLocation # | |
Instance detailsDefined in GHC.Unit.Module.Location |
Outputable ExtendedModSummary # | |
Instance detailsDefined in GHC.Unit.Module.ModSummary |
Outputable ModSummary # | |
Instance detailsDefined in GHC.Unit.Module.ModSummary |
Outputable ModuleName # | |
Instance detailsDefined in GHC.Unit.Module.Name |
Outputable WarningTxt # | |
Instance detailsDefined in GHC.Unit.Module.Warnings |
Outputable Warnings # | |
Instance detailsDefined in GHC.Iface.Load |
Outputable UnitPprInfo # | |
Instance detailsDefined in GHC.Unit.Ppr |
Outputable ModuleOrigin # | |
Instance detailsDefined in GHC.Unit.State |
Outputable UnitErr # | |
Instance detailsDefined in GHC.Unit.State |
Outputable UnusableUnitReason # | |
Instance detailsDefined in GHC.Unit.State |
Outputable InstalledModule # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable InstantiatedModule # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable InstantiatedUnit # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable Module # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable Unit # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable UnitId # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable PprStyle # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable QualifyName # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable SDoc # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable TcSpecPrag # | |
Instance detailsDefined in GHC.Hs.Binds |
Outputable DocDecl # | |
Instance detailsDefined in Language.Haskell.Syntax.Decls |
Outputable ForeignExport # | |
Instance detailsDefined in Language.Haskell.Syntax.Decls |
Outputable ForeignImport # | |
Instance detailsDefined in Language.Haskell.Syntax.Decls |
Outputable NewOrData # | |
Instance detailsDefined in Language.Haskell.Syntax.Decls |
Outputable HsArrowMatchContext # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable SpliceDecoration # | |
Instance detailsDefined in Language.Haskell.Syntax.Expr |
Outputable NoExtCon # | |
Instance detailsDefined in Language.Haskell.Syntax.Extension |
Outputable NoExtField # | |
Instance detailsDefined in Language.Haskell.Syntax.Extension |
Outputable OverLitVal # | |
Instance detailsDefined in Language.Haskell.Syntax.Lit |
Outputable HsIPName # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
Outputable HsTyLit # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
Outputable Serialized # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Extension # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Ordering # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Integer # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable () # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Bool # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Char # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Double # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Float # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Int # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable Word # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable a => Outputable (SCC a) # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable elt => Outputable (IntMap elt) # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable a => Outputable (Set a) # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable a => Outputable (ProtoBCO a) # | |
Instance detailsDefined in GHC.ByteCode.Instr |
Outputable instr => Outputable (GenBasicBlock instr) # | |
Instance detailsDefined in GHC.Cmm |
Outputable instr => Outputable (ListGraph instr) # | |
Instance detailsDefined in GHC.Cmm |
Outputable a => Outputable (LabelMap a) # | |
Instance detailsDefined in GHC.Cmm.Dataflow.Label |
Outputable instr => Outputable (InstrSR instr) # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Liveness |
Outputable instr => Outputable (LiveInstr instr) # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Liveness |
OutputableBndr b => Outputable (Alt b) # | |
Instance detailsDefined in GHC.Core.Ppr |
OutputableBndr b => Outputable (Bind b) # | |
Instance detailsDefined in GHC.Core.Ppr |
OutputableBndr b => Outputable (Expr b) # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable b => Outputable (TaggedBndr b) # | |
Instance detailsDefined in GHC.Core |
Outputable ev => Outputable (NormaliseStepResult ev) # | |
Instance detailsDefined in GHC.Core.Coercion |
Outputable (CoAxiom br) # | |
Instance detailsDefined in GHC.Core.Coercion.Axiom |
Outputable a => Outputable (CoreMap a) # | |
Instance detailsDefined in GHC.Core.Map.Expr |
Outputable a => Outputable (TypeMapG a) # | |
Instance detailsDefined in GHC.Core.Map.Type |
Outputable a => Outputable (Scaled a) # | |
Instance detailsDefined in GHC.Core.TyCo.Rep |
Outputable a => Outputable (UnifyResultM a) # | |
Instance detailsDefined in GHC.Core.Unify |
Outputable a => Outputable (Bag a) # | |
Instance detailsDefined in GHC.Data.Bag |
OutputableBndr a => Outputable (BooleanFormula a) # | |
Instance detailsDefined in GHC.Data.BooleanFormula |
Outputable node => Outputable (Graph node) # | |
Instance detailsDefined in GHC.Data.Graph.Directed |
Outputable a => Outputable (OrdList a) # | |
Instance detailsDefined in GHC.Data.OrdList |
Outputable a => Outputable (Pair a) # | |
Instance detailsDefined in GHC.Data.Pair |
OutputableBndrId p => Outputable (IE (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.ImpExp |
OutputableBndr name => Outputable (IEWrappedName name) # | |
Instance detailsDefined in GHC.Hs.ImpExp |
(OutputableBndrId p, Outputable (Anno (IE (GhcPass p)))) => Outputable (ImportDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.ImpExp |
Outputable a => Outputable (CheckResult a) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable p => Outputable (PmGRHS p) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable p => Outputable (PmGRHSs p) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable p => Outputable (PmMatch p) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable p => Outputable (PmMatchGroup p) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable p => Outputable (PmPatBind p) # | |
Instance detailsDefined in GHC.HsToCore.Pmc.Types |
Outputable a => Outputable (HieAST a) # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable a => Outputable (HieASTs a) # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable a => Outputable (IdentifierDetails a) # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable a => Outputable (NodeInfo a) # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable a => Outputable (SourcedNodeInfo a) # | |
Instance detailsDefined in GHC.Iface.Ext.Types |
Outputable a => Outputable (EvidenceInfo a) # | |
Instance detailsDefined in GHC.Iface.Ext.Utils |
Outputable a => Outputable (EpAnn a) # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable a => Outputable (SrcSpanAnn' a) # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable (PatBuilder GhcPs) # | |
Instance detailsDefined in GHC.Parser.Types |
Outputable a => Outputable (NonVoid a) # | |
Instance detailsDefined in GHC.StgToCmm.Closure |
Outputable theta => Outputable (DerivSpec theta) # | |
Instance detailsDefined in GHC.Tc.Deriv.Utils |
OutputableBndrId (XPass p) => Outputable (EValArg p) # | |
Instance detailsDefined in GHC.Tc.Gen.Head |
OutputableBndrId (XPass p) => Outputable (HsExprArg p) # | |
Instance detailsDefined in GHC.Tc.Gen.Head |
Outputable (FunDepEqn a) # | |
Instance detailsDefined in GHC.Tc.Instance.FunDeps |
Outputable a => Outputable (StopOrContinue a) # | |
Instance detailsDefined in GHC.Tc.Solver.Canonical |
OutputableBndrId a => Outputable (InstInfo (GhcPass a)) # | |
Instance detailsDefined in GHC.Tc.Utils.Env |
Outputable name => Outputable (AnnTarget name) # | |
Instance detailsDefined in GHC.Types.Annotations |
Outputable (DefMethSpec ty) # | |
Instance detailsDefined in GHC.Types.Basic |
Outputable a => Outputable (OccEnv a) # | |
Instance detailsDefined in GHC.Types.Name.Occurrence |
Outputable e => Outputable (Located e) # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable (XTickishId pass) => Outputable (GenTickish pass) # | |
Instance detailsDefined in GHC.Core.Ppr |
Outputable a => Outputable (UniqDSet a) # | |
Instance detailsDefined in GHC.Types.Unique.DSet |
Outputable a => Outputable (UniqSet a) # | |
Instance detailsDefined in GHC.Types.Unique.Set |
Outputable unit => Outputable (Definite unit) # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable a => Outputable (GenWithIsBoot a) # | |
Instance detailsDefined in GHC.Unit.Types |
Outputable unit => Outputable (Indefinite unit) # | |
Instance detailsDefined in GHC.Unit.Types |
OutputableBndrId p => Outputable (ABExport (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Binds |
OutputableBndrId p => Outputable (FixitySig (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Binds |
OutputableBndrId p => Outputable (HsIPBinds (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Binds |
OutputableBndrId p => Outputable (IPBind (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Binds |
Outputable (RecordPatSynField a) # | |
Instance detailsDefined in Language.Haskell.Syntax.Binds |
OutputableBndrId p => Outputable (Sig (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Binds |
OutputableBndrId p => Outputable (AnnDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (ClsInstDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (ConDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (DataFamInstDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (DefaultDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (DerivClauseTys (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (DerivDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (DerivStrategy (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (FamilyDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
Outputable (FamilyInfo pass) # | |
Instance detailsDefined in Language.Haskell.Syntax.Decls |
OutputableBndrId p => Outputable (ForeignDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (FunDep (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (HsDataDefn (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (HsDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (HsDerivingClause (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (HsGroup (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (InstDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndr (IdP (GhcPass p)) => Outputable (RoleAnnotDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (RuleBndr (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (RuleDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (RuleDecls (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (SpliceDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (StandaloneKindSig (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (TyClDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (TyClGroup (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (TyFamInstDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (WarnDecl (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId p => Outputable (WarnDecls (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Decls |
OutputableBndrId idL => Outputable (ApplicativeArg (GhcPass idL)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (ArithSeqInfo (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable (FieldLabelStrings p) # | |
Instance detailsDefined in Language.Haskell.Syntax.Expr |
OutputableBndrId p => Outputable (HsBracket (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsCmd (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsCmdTop (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsExpr (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable (HsFieldLabel p) # | |
Instance detailsDefined in Language.Haskell.Syntax.Expr |
OutputableBndrId p => Outputable (HsMatchContext (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable (HsPragE (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsSplice (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsSplicedThing (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
OutputableBndrId p => Outputable (HsStmtContext (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Expr |
Outputable (HsLit (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Lit |
OutputableBndrId p => Outputable (HsOverLit (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Lit |
OutputableBndrId p => Outputable (Pat (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Pat |
Outputable (AmbiguousFieldOcc (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (ConDeclField (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
Outputable (FieldOcc pass) # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
OutputableBndrId pass => Outputable (HsArrow (GhcPass pass)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (HsForAllTelescope (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (HsPatSigType (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (HsSigType (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (HsType (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
OutputableBndrId p => Outputable (LHsQTyVars (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
Outputable a => Outputable (NonEmpty a) # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable a => Outputable (Maybe a) # | |
Instance detailsDefined in GHC.Utils.Outputable |
Outputable a => Outputable [a] # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable a, Outputable b) => Outputable (Either a b) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable key, Outputable elt) => Outputable (Map key elt) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(OutputableP Platform statics, OutputableP Platform instr) => Outputable (RegAllocStats statics instr) # | |
Instance detailsDefined in GHC.CmmToAsm.Reg.Graph.Stats |
(Outputable a, Outputable b) => Outputable (Node a b) # | |
Instance detailsDefined in GHC.Data.Graph.Directed |
(Outputable a, Outputable (m a)) => Outputable (GenMap m a) # | |
Instance detailsDefined in GHC.Data.TrieMap |
(TrieMap m, Outputable a) => Outputable (ListMap m a) # | |
Instance detailsDefined in GHC.Data.TrieMap |
(Outputable a, Outputable b) => Outputable (HsExpansion a b) # | Just print the original expression (the a ). |
Instance detailsDefined in GHC.Hs.Expr |
Outputable (GenLocated Anchor EpaComment) # | |
Instance detailsDefined in GHC.Parser.Annotation |
(Outputable a, Outputable e) => Outputable (GenLocated (SrcSpanAnn' a) e) # | |
Instance detailsDefined in GHC.Parser.Annotation |
Outputable e => Outputable (GenLocated RealSrcSpan e) # | |
Instance detailsDefined in GHC.Types.SrcLoc |
Outputable a => Outputable (UniqDFM key a) # | |
Instance detailsDefined in GHC.Types.Unique.DFM |
Outputable a => Outputable (UniqFM key a) # | |
Instance detailsDefined in GHC.Types.Unique.FM |
(Outputable k, Outputable a) => Outputable (UniqMap k a) # | |
Instance detailsDefined in GHC.Types.Unique.Map |
(Outputable key, Outputable ele) => Outputable (UniqSDFM key ele) # | |
Instance detailsDefined in GHC.Types.Unique.SDFM |
OutputableBndr tv => Outputable (VarBndr tv TyConBndrVis) # | |
Instance detailsDefined in GHC.Core.TyCon |
Outputable tv => Outputable (VarBndr tv ArgFlag) # | |
Instance detailsDefined in GHC.Types.Var |
Outputable tv => Outputable (VarBndr tv Specificity) # | |
Instance detailsDefined in GHC.Types.Var |
(OutputableBndrId pl, OutputableBndrId pr) => Outputable (HsBindLR (GhcPass pl) (GhcPass pr)) # | |
Instance detailsDefined in GHC.Hs.Binds |
(OutputableBndrId pl, OutputableBndrId pr) => Outputable (HsLocalBindsLR (GhcPass pl) (GhcPass pr)) # | |
Instance detailsDefined in GHC.Hs.Binds |
(OutputableBndrId pl, OutputableBndrId pr) => Outputable (HsValBindsLR (GhcPass pl) (GhcPass pr)) # | |
Instance detailsDefined in GHC.Hs.Binds |
(OutputableBndrId l, OutputableBndrId r) => Outputable (PatSynBind (GhcPass l) (GhcPass r)) # | |
Instance detailsDefined in GHC.Hs.Binds |
(OutputableBndrId pr, Outputable body) => Outputable (Match (GhcPass pr) body) # | |
Instance detailsDefined in GHC.Hs.Expr |
(Outputable (StmtLR (GhcPass idL) (GhcPass idL) (LHsExpr (GhcPass idL))), Outputable (XXParStmtBlock (GhcPass idL) (GhcPass idR))) => Outputable (ParStmtBlock (GhcPass idL) (GhcPass idR)) # | |
Instance detailsDefined in GHC.Hs.Expr |
(Outputable p, OutputableBndr p, Outputable arg) => Outputable (HsRecField' p arg) # | |
Instance detailsDefined in Language.Haskell.Syntax.Pat |
(Outputable arg, Outputable (XRec p (HsRecField p arg))) => Outputable (HsRecFields p arg) # | |
Instance detailsDefined in Language.Haskell.Syntax.Pat |
(Outputable tm, Outputable ty) => Outputable (HsArg tm ty) # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
(OutputableBndrFlag flag p, OutputableBndrFlag flag (NoGhcTcPass p), OutputableBndrId p) => Outputable (HsOuterTyVarBndrs flag (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
Outputable a => Outputable (HsScaled pass a) # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
(OutputableBndrId p, OutputableBndrFlag flag p) => Outputable (HsTyVarBndr flag (GhcPass p)) # | |
Instance detailsDefined in GHC.Hs.Type |
Outputable thing => Outputable (HsWildCardBndrs (GhcPass p) thing) # | |
Instance detailsDefined in GHC.Hs.Type |
(Outputable a, Outputable b) => Outputable (a, b) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(OutputableBndrId pl, OutputableBndrId pr, Anno (StmtLR (GhcPass pl) (GhcPass pr) body) ~ SrcSpanAnnA, Outputable body) => Outputable (StmtLR (GhcPass pl) (GhcPass pr) body) # | |
Instance detailsDefined in GHC.Hs.Expr |
(Outputable tyarg, Outputable arg, Outputable rec) => Outputable (HsConDetails tyarg arg rec) # | |
Instance detailsDefined in Language.Haskell.Syntax.Type |
(Outputable a, Outputable b, Outputable c) => Outputable (a, b, c) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable a, Outputable b, Outputable c, Outputable d) => Outputable (a, b, c, d) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e) => Outputable (a, b, c, d, e) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e, Outputable f) => Outputable (a, b, c, d, e, f) # | |
Instance detailsDefined in GHC.Utils.Outputable |
(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e, Outputable f, Outputable g) => Outputable (a, b, c, d, e, f, g) # | |
Instance detailsDefined in GHC.Utils.Outputable |