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