breakpoint-0.1.4.0: Set breakpoints using a GHC plugin
Safe HaskellSafe-Inferred
LanguageHaskell2010

Debug.Breakpoint.GhcFacade

Documentation

data Class #

Instances

Instances details
Data Class 
Instance details

Defined in GHC.Core.Class

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Class -> c Class

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Class

toConstr :: Class -> Constr

dataTypeOf :: Class -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Class)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Class)

gmapT :: (forall b. Data b => b -> b) -> Class -> Class

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Class -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Class -> r

gmapQ :: (forall d. Data d => d -> u) -> Class -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Class -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Class -> m Class

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Class -> m Class

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Class -> m Class

NamedThing Class 
Instance details

Defined in GHC.Core.Class

Uniquable Class 
Instance details

Defined in GHC.Core.Class

Methods

getUnique :: Class -> Unique #

Outputable Class 
Instance details

Defined in GHC.Core.Class

Methods

ppr :: Class -> SDoc #

Eq Class 
Instance details

Defined in GHC.Core.Class

Methods

(==) :: Class -> Class -> Bool

(/=) :: Class -> Class -> Bool

type DefaultingPlugin = [CommandLineOption] -> Maybe DefaultingPlugin #

data FunDep pass #

Constructors

FunDep (XCFunDep pass) [LIdP pass] [LIdP pass] 
XFunDep !(XXFunDep pass) 

Instances

Instances details
type Anno (FunDep (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data Plugins #

Constructors

Plugins 

Fields

data SrcLoc #

Instances

Instances details
Show SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> SrcLoc -> ShowS

show :: SrcLoc -> String

showList :: [SrcLoc] -> ShowS

Outputable SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: SrcLoc -> SDoc #

Eq SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcLoc -> SrcLoc -> Bool

(/=) :: SrcLoc -> SrcLoc -> Bool

data Name #

Instances

Instances details
Data Name 
Instance details

Defined in GHC.Types.Name

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name

toConstr :: Name -> Constr

dataTypeOf :: Name -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name)

gmapT :: (forall b. Data b => b -> b) -> Name -> Name

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r

gmapQ :: (forall d. Data d => d -> u) -> Name -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name

NFData Name 
Instance details

Defined in GHC.Types.Name

Methods

rnf :: Name -> ()

NamedThing Name 
Instance details

Defined in GHC.Types.Name

HasOccName Name 
Instance details

Defined in GHC.Types.Name

Methods

occName :: Name -> OccName #

Uniquable Name 
Instance details

Defined in GHC.Types.Name

Methods

getUnique :: Name -> Unique #

Binary Name 
Instance details

Defined in GHC.Types.Name

Methods

put_ :: BinHandle -> Name -> IO ()

put :: BinHandle -> Name -> IO (Bin Name)

get :: BinHandle -> IO Name

Outputable Name 
Instance details

Defined in GHC.Types.Name

Methods

ppr :: Name -> SDoc #

OutputableBndr Name 
Instance details

Defined in GHC.Types.Name

Eq Name 
Instance details

Defined in GHC.Types.Name

Methods

(==) :: Name -> Name -> Bool

(/=) :: Name -> Name -> Bool

Ord Name 
Instance details

Defined in GHC.Types.Name

Methods

compare :: Name -> Name -> Ordering

(<) :: Name -> Name -> Bool

(<=) :: Name -> Name -> Bool

(>) :: Name -> Name -> Bool

(>=) :: Name -> Name -> Bool

max :: Name -> Name -> Name

min :: Name -> Name -> Name

type Anno Name 
Instance details

Defined in GHC.Hs.Extension

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

data Env gbl lcl #

Constructors

Env 

Fields

Instances

Instances details
ContainsHooks (Env gbl lcl) 
Instance details

Defined in GHC.Tc.Types

Methods

extractHooks :: Env gbl lcl -> Hooks

ContainsDynFlags (Env gbl lcl) 
Instance details

Defined in GHC.Tc.Types

Methods

extractDynFlags :: Env gbl lcl -> DynFlags

ContainsModule gbl => ContainsModule (Env gbl lcl) 
Instance details

Defined in GHC.Tc.Types

Methods

extractModule :: Env gbl lcl -> Module

ContainsLogger (Env gbl lcl) 
Instance details

Defined in GHC.Tc.Types

Methods

extractLogger :: Env gbl lcl -> Logger

data FastString #

Constructors

FastString 

Fields

Instances

Instances details
Data FastString 
Instance details

Defined in GHC.Data.FastString

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FastString -> c FastString

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FastString

toConstr :: FastString -> Constr

dataTypeOf :: FastString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FastString)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FastString)

gmapT :: (forall b. Data b => b -> b) -> FastString -> FastString

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FastString -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FastString -> r

gmapQ :: (forall d. Data d => d -> u) -> FastString -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> FastString -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FastString -> m FastString

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FastString -> m FastString

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FastString -> m FastString

IsString FastString 
Instance details

Defined in GHC.Data.FastString

Methods

fromString :: String -> FastString

Monoid FastString 
Instance details

Defined in GHC.Data.FastString

Semigroup FastString 
Instance details

Defined in GHC.Data.FastString

Methods

(<>) :: FastString -> FastString -> FastString

sconcat :: NonEmpty FastString -> FastString

stimes :: Integral b => b -> FastString -> FastString

Show FastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> FastString -> ShowS

show :: FastString -> String

showList :: [FastString] -> ShowS

NFData FastString 
Instance details

Defined in GHC.Data.FastString

Methods

rnf :: FastString -> ()

Uniquable FastString 
Instance details

Defined in GHC.Types.Unique

Outputable FastString 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: FastString -> SDoc #

Eq FastString 
Instance details

Defined in GHC.Data.FastString

Methods

(==) :: FastString -> FastString -> Bool

(/=) :: FastString -> FastString -> Bool

type Anno FastString 
Instance details

Defined in GHC.Hs.Expr

type Anno (SourceText, RuleName) 
Instance details

Defined in GHC.Hs.Decls

type Anno (SourceText, RuleName) = SrcAnn NoEpAnns

class Outputable a where #

Methods

ppr :: a -> SDoc #

Instances

Instances details
Outputable Fingerprint 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Fingerprint -> SDoc #

Outputable Int16 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int16 -> SDoc #

Outputable Int32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int32 -> SDoc #

Outputable Int64 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int64 -> SDoc #

Outputable Int8 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int8 -> SDoc #

Outputable Word16 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word16 -> SDoc #

Outputable Word32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word32 -> SDoc #

Outputable Word64 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word64 -> SDoc #

Outputable Word8 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word8 -> SDoc #

Outputable IntSet 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: IntSet -> SDoc #

Outputable PrimCall 
Instance details

Defined in GHC.Builtin.PrimOps

Methods

ppr :: PrimCall -> SDoc #

Outputable PrimOp 
Instance details

Defined in GHC.Builtin.PrimOps

Methods

ppr :: PrimOp -> SDoc #

Outputable Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

ppr :: Label -> SDoc #

Outputable LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

ppr :: LabelSet -> SDoc #

Outputable AltCon 
Instance details

Defined in GHC.Core

Methods

ppr :: AltCon -> SDoc #

Outputable Class 
Instance details

Defined in GHC.Core.Class

Methods

ppr :: Class -> SDoc #

Outputable CoAxBranch 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

ppr :: CoAxBranch -> SDoc #

Outputable CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

ppr :: CoAxiomRule -> SDoc #

Outputable ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

ppr :: ConLike -> SDoc #

Outputable DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: DataCon -> SDoc #

Outputable EqSpec 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: EqSpec -> SDoc #

Outputable HsImplBang 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: HsImplBang -> SDoc #

Outputable HsSrcBang 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: HsSrcBang -> SDoc #

Outputable StrictnessMark 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: StrictnessMark -> SDoc #

Outputable FamInst 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

ppr :: FamInst -> SDoc #

Outputable FamInstEnv 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

ppr :: FamInstEnv -> SDoc #

Outputable FamInstMatch 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

ppr :: FamInstMatch -> SDoc #

Outputable ClsInst 
Instance details

Defined in GHC.Core.InstEnv

Methods

ppr :: ClsInst -> SDoc #

Outputable InstEnv 
Instance details

Defined in GHC.Core.InstEnv

Methods

ppr :: InstEnv -> SDoc #

Outputable InstMatches 
Instance details

Defined in GHC.Core.InstEnv

Methods

ppr :: InstMatches -> SDoc #

Outputable PotentialUnifiers 
Instance details

Defined in GHC.Core.InstEnv

Outputable FloatBind 
Instance details

Defined in GHC.Core.Make

Methods

ppr :: FloatBind -> SDoc #

Outputable FloatOutSwitches 
Instance details

Defined in GHC.Core.Opt.Monad

Methods

ppr :: FloatOutSwitches -> SDoc #

Outputable CoreToDo 
Instance details

Defined in GHC.Core.Opt.Pipeline.Types

Methods

ppr :: CoreToDo -> SDoc #

Outputable PatSyn 
Instance details

Defined in GHC.Core.PatSyn

Methods

ppr :: PatSyn -> SDoc #

Outputable EqRel 
Instance details

Defined in GHC.Core.Predicate

Methods

ppr :: EqRel -> SDoc #

Outputable Reduction 
Instance details

Defined in GHC.Core.Reduction

Methods

ppr :: Reduction -> SDoc #

Outputable RoughMatchLookupTc 
Instance details

Defined in GHC.Core.RoughMap

Methods

ppr :: RoughMatchLookupTc -> SDoc #

Outputable RoughMatchTc 
Instance details

Defined in GHC.Core.RoughMap

Methods

ppr :: RoughMatchTc -> SDoc #

Outputable CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: CoSel -> SDoc #

Outputable Coercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Coercion -> SDoc #

Outputable CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: CoercionHole -> SDoc #

Outputable FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: FunSel -> SDoc #

Outputable MCoercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: MCoercion -> SDoc #

Outputable TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: TyLit -> SDoc #

Outputable Type 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Type -> SDoc #

Outputable UnivCoProvenance 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: UnivCoProvenance -> SDoc #

Outputable Subst 
Instance details

Defined in GHC.Core.TyCo.Subst

Methods

ppr :: Subst -> SDoc #

Outputable AlgTyConFlav 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: AlgTyConFlav -> SDoc #

Outputable FamTyConFlav 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: FamTyConFlav -> SDoc #

Outputable PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: PrimElemRep -> SDoc #

Outputable PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: PrimRep -> SDoc #

Outputable TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: TyCon -> SDoc #

Outputable TyConBndrVis 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: TyConBndrVis -> SDoc #

Outputable TyConFlavour 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: TyConFlavour -> SDoc #

Outputable MaybeApartReason 
Instance details

Defined in GHC.Core.Unify

Methods

ppr :: MaybeApartReason -> SDoc #

Outputable Usage 
Instance details

Defined in GHC.Core.UsageEnv

Methods

ppr :: Usage -> SDoc #

Outputable UsageEnv 
Instance details

Defined in GHC.Core.UsageEnv

Methods

ppr :: UsageEnv -> SDoc #

Outputable FastString 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: FastString -> SDoc #

Outputable LexicalFastString 
Instance details

Defined in GHC.Utils.Outputable

Outputable NonDetFastString 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: NonDetFastString -> SDoc #

Outputable Language 
Instance details

Defined in GHC.Driver.Flags

Methods

ppr :: Language -> SDoc #

Outputable PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Methods

ppr :: PluginRecompile -> SDoc #

Outputable GhcMode 
Instance details

Defined in GHC.Driver.Session

Methods

ppr :: GhcMode -> SDoc #

Outputable ModRenaming 
Instance details

Defined in GHC.Driver.Session

Methods

ppr :: ModRenaming -> SDoc #

Outputable PackageArg 
Instance details

Defined in GHC.Driver.Session

Methods

ppr :: PackageArg -> SDoc #

Outputable PackageFlag 
Instance details

Defined in GHC.Driver.Session

Methods

ppr :: PackageFlag -> SDoc #

Outputable ABExport 
Instance details

Defined in GHC.Hs.Binds

Methods

ppr :: ABExport -> SDoc #

Outputable TcSpecPrag 
Instance details

Defined in GHC.Hs.Binds

Methods

ppr :: TcSpecPrag -> SDoc #

Outputable XViaStrategyPs 
Instance details

Defined in GHC.Hs.Decls

Methods

ppr :: XViaStrategyPs -> SDoc #

Outputable DocStructureItem 
Instance details

Defined in GHC.Hs.Doc

Methods

ppr :: DocStructureItem -> SDoc #

Outputable Docs 
Instance details

Defined in GHC.Hs.Doc

Methods

ppr :: Docs -> SDoc #

Outputable GrhsAnn 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: GrhsAnn -> SDoc #

Outputable PendingRnSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: PendingRnSplice -> SDoc #

Outputable PendingTcSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: PendingTcSplice -> SDoc #

Outputable SyntaxExprRn 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: SyntaxExprRn -> SDoc #

Outputable SyntaxExprTc 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: SyntaxExprTc -> SDoc #

Outputable XXExprGhcTc 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: XXExprGhcTc -> SDoc #

Outputable BotInfo 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: BotInfo -> SDoc #

Outputable Nabla 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: Nabla -> SDoc #

Outputable Nablas 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: Nablas -> SDoc #

Outputable PmAltCon 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmAltCon -> SDoc #

Outputable PmAltConApp 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmAltConApp -> SDoc #

Outputable PmAltConSet 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmAltConSet -> SDoc #

Outputable PmEquality 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmEquality -> SDoc #

Outputable PmLit 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmLit -> SDoc #

Outputable PmLitValue 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: PmLitValue -> SDoc #

Outputable ResidualCompleteMatches 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: ResidualCompleteMatches -> SDoc #

Outputable TmState 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: TmState -> SDoc #

Outputable TyState 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: TyState -> SDoc #

Outputable VarInfo 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

ppr :: VarInfo -> SDoc #

Outputable IfGuidance 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfGuidance -> SDoc #

Outputable IfaceAT 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceAT -> SDoc #

Outputable IfaceAnnotation 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceAnnotation -> SDoc #

Outputable IfaceClassOp 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceClassOp -> SDoc #

Outputable IfaceClsInst 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceClsInst -> SDoc #

Outputable IfaceCompleteMatch 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceCompleteMatch -> SDoc #

Outputable IfaceConAlt 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceConAlt -> SDoc #

Outputable IfaceDecl 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceDecl -> SDoc #

Outputable IfaceExpr 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceExpr -> SDoc #

Outputable IfaceFamInst 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceFamInst -> SDoc #

Outputable IfaceIdDetails 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceIdDetails -> SDoc #

Outputable IfaceInfoItem 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceInfoItem -> SDoc #

Outputable IfaceJoinInfo 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceJoinInfo -> SDoc #

Outputable IfaceLFInfo 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceLFInfo -> SDoc #

Outputable IfaceMaybeRhs 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceMaybeRhs -> SDoc #

Outputable IfaceRule 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceRule -> SDoc #

Outputable IfaceTopBndrInfo 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceTopBndrInfo -> SDoc #

Outputable IfaceTyConParent 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceTyConParent -> SDoc #

Outputable IfaceUnfolding 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceUnfolding -> SDoc #

Outputable ShowHowMuch 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: ShowHowMuch -> SDoc #

Outputable IfaceAppArgs 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceAppArgs -> SDoc #

Outputable IfaceBndr 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceBndr -> SDoc #

Outputable IfaceCoercion 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceCoercion -> SDoc #

Outputable IfaceOneShot 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceOneShot -> SDoc #

Outputable IfaceTyCon 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceTyCon -> SDoc #

Outputable IfaceTyConInfo 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceTyConInfo -> SDoc #

Outputable IfaceTyConSort 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceTyConSort -> SDoc #

Outputable IfaceTyLit 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceTyLit -> SDoc #

Outputable IfaceType 
Instance details

Defined in GHC.Iface.Type

Methods

ppr :: IfaceType -> SDoc #

Outputable LibrarySpec 
Instance details

Defined in GHC.Linker.Types

Methods

ppr :: LibrarySpec -> SDoc #

Outputable Linkable 
Instance details

Defined in GHC.Linker.Types

Methods

ppr :: Linkable -> SDoc #

Outputable LoadedPkgInfo 
Instance details

Defined in GHC.Linker.Types

Methods

ppr :: LoadedPkgInfo -> SDoc #

Outputable SptEntry 
Instance details

Defined in GHC.Linker.Types

Methods

ppr :: SptEntry -> SDoc #

Outputable Unlinked 
Instance details

Defined in GHC.Linker.Types

Methods

ppr :: Unlinked -> SDoc #

Outputable AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AddEpAnn -> SDoc #

Outputable Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: Anchor -> SDoc #

Outputable AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnchorOperation -> SDoc #

Outputable AnnContext 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnContext -> SDoc #

Outputable AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnKeywordId -> SDoc #

Outputable AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnList -> SDoc #

Outputable AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnListItem -> SDoc #

Outputable AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnPragma -> SDoc #

Outputable AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnSortKey -> SDoc #

Outputable DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: DeltaPos -> SDoc #

Outputable EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpAnnComments -> SDoc #

Outputable EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpaComment -> SDoc #

Outputable EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpaLocation -> SDoc #

Outputable IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: IsUnicodeSyntax -> SDoc #

Outputable NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NameAdornment -> SDoc #

Outputable NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NameAnn -> SDoc #

Outputable NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NoEpAnns -> SDoc #

Outputable TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: TrailingAnn -> SDoc #

Outputable DataConBuilder 
Instance details

Defined in GHC.Parser.Types

Methods

ppr :: DataConBuilder -> SDoc #

Outputable TagInfo 
Instance details

Defined in GHC.Stg.InferTags.TagSig

Methods

ppr :: TagInfo -> SDoc #

Outputable TagSig 
Instance details

Defined in GHC.Stg.InferTags.TagSig

Methods

ppr :: TagSig -> SDoc #

Outputable BinderInfo 
Instance details

Defined in GHC.Stg.Lift.Analysis

Methods

ppr :: BinderInfo -> SDoc #

Outputable Skeleton 
Instance details

Defined in GHC.Stg.Lift.Analysis

Methods

ppr :: Skeleton -> SDoc #

Outputable AltType 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: AltType -> SDoc #

Outputable ConstructorNumber 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: ConstructorNumber -> SDoc #

Outputable NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: NoExtFieldSilent -> SDoc #

Outputable StgArg 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: StgArg -> SDoc #

Outputable StgOp 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: StgOp -> SDoc #

Outputable UpdateFlag 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: UpdateFlag -> SDoc #

Outputable LambdaFormInfo 
Instance details

Defined in GHC.StgToCmm.Types

Methods

ppr :: LambdaFormInfo -> SDoc #

Outputable StandardFormInfo 
Instance details

Defined in GHC.StgToCmm.Types

Methods

ppr :: StandardFormInfo -> SDoc #

Outputable HoleFit 
Instance details

Defined in GHC.Tc.Errors.Hole.FitTypes

Methods

ppr :: HoleFit -> SDoc #

Outputable HoleFitCandidate 
Instance details

Defined in GHC.Tc.Errors.Hole.FitTypes

Methods

ppr :: HoleFitCandidate -> SDoc #

Outputable TypedHole 
Instance details

Defined in GHC.Tc.Errors.Hole.FitTypes

Methods

ppr :: TypedHole -> SDoc #

Outputable ErrorItem 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

ppr :: ErrorItem -> SDoc #

Outputable Exported 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

ppr :: Exported -> SDoc #

Outputable PromotionErr 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

ppr :: PromotionErr -> SDoc #

Outputable TypeDataForbids 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

ppr :: TypeDataForbids -> SDoc #

Outputable TouchabilityTestResult 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

ppr :: TouchabilityTestResult -> SDoc #

Outputable DefaultingProposal 
Instance details

Defined in GHC.Tc.Types

Outputable IdBindingInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: IdBindingInfo -> SDoc #

Outputable TcBinder 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcBinder -> SDoc #

Outputable TcIdSigInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcIdSigInfo -> SDoc #

Outputable TcIdSigInst 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcIdSigInst -> SDoc #

Outputable TcPatSynInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcPatSynInfo -> SDoc #

Outputable TcSigInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcSigInfo -> SDoc #

Outputable TcTyThing 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcTyThing -> SDoc #

Outputable ThStage 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: ThStage -> SDoc #

Outputable WhereFrom 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: WhereFrom -> SDoc #

Outputable CanEqLHS 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CanEqLHS -> SDoc #

Outputable CheckTyEqResult 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CheckTyEqResult -> SDoc #

Outputable Ct 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Ct -> SDoc #

Outputable CtEvidence 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CtEvidence -> SDoc #

Outputable CtFlavour 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CtFlavour -> SDoc #

Outputable CtIrredReason 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CtIrredReason -> SDoc #

Outputable DelayedError 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: DelayedError -> SDoc #

Outputable HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: HasGivenEqs -> SDoc #

Outputable Hole 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Hole -> SDoc #

Outputable HoleSort 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: HoleSort -> SDoc #

Outputable ImplicStatus 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: ImplicStatus -> SDoc #

Outputable Implication 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Implication -> SDoc #

Outputable NotConcreteError 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: NotConcreteError -> SDoc #

Outputable QCInst 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: QCInst -> SDoc #

Outputable RewriterSet 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: RewriterSet -> SDoc #

Outputable SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: SubGoalDepth -> SDoc #

Outputable TcEvDest 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: TcEvDest -> SDoc #

Outputable WantedConstraints 
Instance details

Defined in GHC.Tc.Types.Constraint

Outputable EvBind 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBind -> SDoc #

Outputable EvBindMap 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBindMap -> SDoc #

Outputable EvBindsVar 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBindsVar -> SDoc #

Outputable EvCallStack 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvCallStack -> SDoc #

Outputable EvTerm 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvTerm -> SDoc #

Outputable EvTypeable 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvTypeable -> SDoc #

Outputable HoleExprRef 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: HoleExprRef -> SDoc #

Outputable HsWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: HsWrapper -> SDoc #

Outputable TcEvBinds 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: TcEvBinds -> SDoc #

Outputable CtOrigin 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: CtOrigin -> SDoc #

Outputable FRRArrowContext 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: FRRArrowContext -> SDoc #

Outputable FixedRuntimeRepContext 
Instance details

Defined in GHC.Tc.Types.Origin

Outputable NakedScFlag 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: NakedScFlag -> SDoc #

Outputable RepPolyFun 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: RepPolyFun -> SDoc #

Outputable SkolemInfo 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: SkolemInfo -> SDoc #

Outputable SkolemInfoAnon 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: SkolemInfoAnon -> SDoc #

Outputable StmtOrigin 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: StmtOrigin -> SDoc #

Outputable TyVarBndrs 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: TyVarBndrs -> SDoc #

Outputable TypedThing 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: TypedThing -> SDoc #

Outputable IsExtraConstraint 
Instance details

Defined in GHC.Tc.Utils.Monad

Outputable ExpType 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: ExpType -> SDoc #

Outputable InferResult 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: InferResult -> SDoc #

Outputable MetaDetails 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: MetaDetails -> SDoc #

Outputable MetaInfo 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: MetaInfo -> SDoc #

Outputable PatersonSize 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: PatersonSize -> SDoc #

Outputable TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: TcLevel -> SDoc #

Outputable TcTyVarDetails 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: TcTyVarDetails -> SDoc #

Outputable Annotation 
Instance details

Defined in GHC.Types.Annotations

Methods

ppr :: Annotation -> SDoc #

Outputable AvailInfo 
Instance details

Defined in GHC.Types.Avail

Methods

ppr :: AvailInfo -> SDoc #

Outputable GreName 
Instance details

Defined in GHC.Types.Avail

Methods

ppr :: GreName -> SDoc #

Outputable Activation 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Activation -> SDoc #

Outputable Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Alignment -> SDoc #

Outputable CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: CbvMark -> SDoc #

Outputable CompilerPhase 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: CompilerPhase -> SDoc #

Outputable DefaultingStrategy 
Instance details

Defined in GHC.Types.Basic

Outputable FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: FunctionOrData -> SDoc #

Outputable InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: InlinePragma -> SDoc #

Outputable InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: InlineSpec -> SDoc #

Outputable IntWithInf 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: IntWithInf -> SDoc #

Outputable LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: LeftOrRight -> SDoc #

Outputable Levity 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Levity -> SDoc #

Outputable NonStandardDefaultingStrategy 
Instance details

Defined in GHC.Types.Basic

Outputable OccInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OccInfo -> SDoc #

Outputable OneShotInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OneShotInfo -> SDoc #

Outputable Origin 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Origin -> SDoc #

Outputable OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OverlapFlag -> SDoc #

Outputable OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OverlapMode -> SDoc #

Outputable RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: RecFlag -> SDoc #

Outputable RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: RuleMatchInfo -> SDoc #

Outputable SuccessFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: SuccessFlag -> SDoc #

Outputable SwapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: SwapFlag -> SDoc #

Outputable TailCallInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TailCallInfo -> SDoc #

Outputable TopLevelFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TopLevelFlag -> SDoc #

Outputable TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TupleSort -> SDoc #

Outputable TypeOrKind 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TypeOrKind -> SDoc #

Outputable UnboxedTupleOrSum 
Instance details

Defined in GHC.Types.Basic

Outputable UnfoldingSource 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: UnfoldingSource -> SDoc #

Outputable CompleteMatch 
Instance details

Defined in GHC.Types.CompleteMatch

Methods

ppr :: CompleteMatch -> SDoc #

Outputable Cpr 
Instance details

Defined in GHC.Types.Cpr

Methods

ppr :: Cpr -> SDoc #

Outputable CprSig 
Instance details

Defined in GHC.Types.Cpr

Methods

ppr :: CprSig -> SDoc #

Outputable CprType 
Instance details

Defined in GHC.Types.Cpr

Methods

ppr :: CprType -> SDoc #

Outputable Card 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: Card -> SDoc #

Outputable Demand 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: Demand -> SDoc #

Outputable Divergence 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: Divergence -> SDoc #

Outputable DmdEnv 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: DmdEnv -> SDoc #

Outputable DmdSig 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: DmdSig -> SDoc #

Outputable DmdType 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: DmdType -> SDoc #

Outputable SubDemand 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: SubDemand -> SDoc #

Outputable TypeShape 
Instance details

Defined in GHC.Types.Demand

Methods

ppr :: TypeShape -> SDoc #

Outputable DiagnosticCode 
Instance details

Defined in GHC.Types.Error

Methods

ppr :: DiagnosticCode -> SDoc #

Outputable DiagnosticHint 
Instance details

Defined in GHC.Types.Error

Methods

ppr :: DiagnosticHint -> SDoc #

Outputable DiagnosticReason 
Instance details

Defined in GHC.Types.Error

Methods

ppr :: DiagnosticReason -> SDoc #

Outputable Severity 
Instance details

Defined in GHC.Types.Error

Methods

ppr :: Severity -> SDoc #

Outputable DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Methods

ppr :: DuplicateRecordFields -> SDoc #

Outputable FieldLabel 
Instance details

Defined in GHC.Types.FieldLabel

Methods

ppr :: FieldLabel -> SDoc #

Outputable FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Methods

ppr :: FieldSelectors -> SDoc #

Outputable Fixity 
Instance details

Defined in GHC.Types.Fixity

Methods

ppr :: Fixity -> SDoc #

Outputable FixityDirection 
Instance details

Defined in GHC.Types.Fixity

Methods

ppr :: FixityDirection -> SDoc #

Outputable LexicalFixity 
Instance details

Defined in GHC.Types.Fixity

Methods

ppr :: LexicalFixity -> SDoc #

Outputable FixItem 
Instance details

Defined in GHC.Types.Fixity.Env

Methods

ppr :: FixItem -> SDoc #

Outputable CCallConv 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: CCallConv -> SDoc #

Outputable CCallSpec 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: CCallSpec -> SDoc #

Outputable CExportSpec 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: CExportSpec -> SDoc #

Outputable CType 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: CType -> SDoc #

Outputable ForeignCall 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: ForeignCall -> SDoc #

Outputable Header 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: Header -> SDoc #

Outputable Safety 
Instance details

Defined in GHC.Types.ForeignCall

Methods

ppr :: Safety -> SDoc #

Outputable CafInfo 
Instance details

Defined in GHC.Types.Id.Info

Methods

ppr :: CafInfo -> SDoc #

Outputable IdDetails 
Instance details

Defined in GHC.Types.Id.Info

Methods

ppr :: IdDetails -> SDoc #

Outputable RecSelParent 
Instance details

Defined in GHC.Types.Id.Info

Methods

ppr :: RecSelParent -> SDoc #

Outputable TickBoxOp 
Instance details

Defined in GHC.Types.Id.Info

Methods

ppr :: TickBoxOp -> SDoc #

Outputable Name 
Instance details

Defined in GHC.Types.Name

Methods

ppr :: Name -> SDoc #

Outputable NameSort 
Instance details

Defined in GHC.Types.Name

Methods

ppr :: NameSort -> SDoc #

Outputable OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

ppr :: OccName -> SDoc #

Outputable GlobalRdrElt 
Instance details

Defined in GHC.Types.Name.Reader

Methods

ppr :: GlobalRdrElt -> SDoc #

Outputable ImportSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

ppr :: ImportSpec -> SDoc #

Outputable LocalRdrEnv 
Instance details

Defined in GHC.Types.Name.Reader

Methods

ppr :: LocalRdrEnv -> SDoc #

Outputable Parent 
Instance details

Defined in GHC.Types.Name.Reader

Methods

ppr :: Parent -> SDoc #

Outputable RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

ppr :: RdrName -> SDoc #

Outputable PkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

ppr :: PkgQual -> SDoc #

Outputable RawPkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

ppr :: RawPkgQual -> SDoc #

Outputable IfaceTrustInfo 
Instance details

Defined in GHC.Types.SafeHaskell

Methods

ppr :: IfaceTrustInfo -> SDoc #

Outputable SafeHaskellMode 
Instance details

Defined in GHC.Types.SafeHaskell

Methods

ppr :: SafeHaskellMode -> SDoc #

Outputable FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Methods

ppr :: FractionalLit -> SDoc #

Outputable IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Methods

ppr :: IntegralLit -> SDoc #

Outputable SourceText 
Instance details

Defined in GHC.Types.SourceText

Methods

ppr :: SourceText -> SDoc #

Outputable StringLiteral 
Instance details

Defined in GHC.Types.SourceText

Methods

ppr :: StringLiteral -> SDoc #

Outputable RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: RealSrcLoc -> SDoc #

Outputable RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: RealSrcSpan -> SDoc #

Outputable SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: SrcLoc -> SDoc #

Outputable SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: SrcSpan -> SDoc #

Outputable UnhelpfulSpanReason 
Instance details

Defined in GHC.Types.SrcLoc

Outputable TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Methods

ppr :: TickishPlacement -> SDoc #

Outputable TyThing 
Instance details

Defined in GHC.Types.TyThing

Methods

ppr :: TyThing -> SDoc #

Outputable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

ppr :: Unique -> SDoc #

Outputable ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: ForAllTyFlag -> SDoc #

Outputable FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: FunTyFlag -> SDoc #

Outputable PiTyBinder 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: PiTyBinder -> SDoc #

Outputable Var 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: Var -> SDoc #

Outputable InScopeSet 
Instance details

Defined in GHC.Types.Var.Env

Methods

ppr :: InScopeSet -> SDoc #

Outputable HomeUnitEnv 
Instance details

Defined in GHC.Unit.Env

Methods

ppr :: HomeUnitEnv -> SDoc #

Outputable HomeModLinkable 
Instance details

Defined in GHC.Unit.Home.ModInfo

Methods

ppr :: HomeModLinkable -> SDoc #

Outputable PackageId 
Instance details

Defined in GHC.Unit.Info

Methods

ppr :: PackageId -> SDoc #

Outputable PackageName 
Instance details

Defined in GHC.Unit.Info

Methods

ppr :: PackageName -> SDoc #

Outputable NDModule 
Instance details

Defined in GHC.Unit.Module.Env

Methods

ppr :: NDModule -> SDoc #

Outputable ModLocation 
Instance details

Defined in GHC.Unit.Module.Location

Methods

ppr :: ModLocation -> SDoc #

Outputable ModSummary 
Instance details

Defined in GHC.Unit.Module.ModSummary

Methods

ppr :: ModSummary -> SDoc #

Outputable ModuleOrigin 
Instance details

Defined in GHC.Unit.State

Methods

ppr :: ModuleOrigin -> SDoc #

Outputable UnitErr 
Instance details

Defined in GHC.Unit.State

Methods

ppr :: UnitErr -> SDoc #

Outputable UnitVisibility 
Instance details

Defined in GHC.Unit.State

Methods

ppr :: UnitVisibility -> SDoc #

Outputable UnusableUnitReason 
Instance details

Defined in GHC.Unit.State

Methods

ppr :: UnusableUnitReason -> SDoc #

Outputable InstalledModule 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstalledModule -> SDoc #

Outputable InstantiatedModule 
Instance details

Defined in GHC.Unit.Types

Outputable InstantiatedUnit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstantiatedUnit -> SDoc #

Outputable Module 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Module -> SDoc #

Outputable Unit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Unit -> SDoc #

Outputable UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: UnitId -> SDoc #

Outputable PprStyle 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: PprStyle -> SDoc #

Outputable QualifyName 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: QualifyName -> SDoc #

Outputable SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: SDoc -> SDoc #

Outputable ModuleName 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: ModuleName -> SDoc #

Outputable Serialized 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Serialized -> SDoc #

Outputable Extension 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Extension -> SDoc #

Outputable Ordering 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Ordering -> SDoc #

Outputable UTCTime 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: UTCTime -> SDoc #

Outputable Integer 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Integer -> SDoc #

Outputable () 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: () -> SDoc #

Outputable Bool 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Bool -> SDoc #

Outputable Double 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Double -> SDoc #

Outputable Float 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Float -> SDoc #

Outputable Int 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int -> SDoc #

Outputable Word 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word -> SDoc #

Outputable a => Outputable (NonEmpty a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: NonEmpty a -> SDoc #

Outputable a => Outputable (SCC a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: SCC a -> SDoc #

Outputable elt => Outputable (IntMap elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: IntMap elt -> SDoc #

Outputable a => Outputable (Set a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Set a -> SDoc #

Outputable a => Outputable (LabelMap a) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

ppr :: LabelMap a -> SDoc #

Outputable b => Outputable (TaggedBndr b) 
Instance details

Defined in GHC.Core

Methods

ppr :: TaggedBndr b -> SDoc #

Outputable (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

ppr :: CoAxiom br -> SDoc #

Outputable a => Outputable (CoreMap a) 
Instance details

Defined in GHC.Core.Map.Expr

Methods

ppr :: CoreMap a -> SDoc #

Outputable a => Outputable (TypeMapG a) 
Instance details

Defined in GHC.Core.Map.Type

Methods

ppr :: TypeMapG a -> SDoc #

Outputable a => Outputable (RoughMap a) 
Instance details

Defined in GHC.Core.RoughMap

Methods

ppr :: RoughMap a -> SDoc #

Outputable a => Outputable (Scaled a) 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Scaled a -> SDoc #

Outputable a => Outputable (UnifyResultM a) 
Instance details

Defined in GHC.Core.Unify

Methods

ppr :: UnifyResultM a -> SDoc #

Outputable a => Outputable (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

ppr :: Bag a -> SDoc #

OutputableBndr a => Outputable (BooleanFormula a) 
Instance details

Defined in GHC.Data.BooleanFormula

Methods

ppr :: BooleanFormula a -> SDoc #

Outputable (KnotVars a) 
Instance details

Defined in GHC.Driver.Env.KnotVars

Methods

ppr :: KnotVars a -> SDoc #

Outputable a => Outputable (OnOff a) 
Instance details

Defined in GHC.Driver.Session

Methods

ppr :: OnOff a -> SDoc #

Outputable a => Outputable (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpAnn a -> SDoc #

Outputable a => Outputable (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: SrcSpanAnn' a -> SDoc #

Outputable (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.Types

Methods

ppr :: PatBuilder GhcPs -> SDoc #

Outputable (TagEnv p) 
Instance details

Defined in GHC.Stg.InferTags.Types

Methods

ppr :: TagEnv p -> SDoc #

OutputablePass pass => Outputable (GenStgBinding pass) 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: GenStgBinding pass -> SDoc #

OutputablePass pass => Outputable (GenStgExpr pass) 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: GenStgExpr pass -> SDoc #

OutputablePass pass => Outputable (GenStgRhs pass) 
Instance details

Defined in GHC.Stg.Syntax

Methods

ppr :: GenStgRhs pass -> SDoc #

OutputableBndrId a => Outputable (InstInfo (GhcPass a)) 
Instance details

Defined in GHC.Tc.Utils.Env

Methods

ppr :: InstInfo (GhcPass a) -> SDoc #

Outputable name => Outputable (AnnTarget name) 
Instance details

Defined in GHC.Types.Annotations

Methods

ppr :: AnnTarget name -> SDoc #

Outputable (DefMethSpec ty) 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: DefMethSpec ty -> SDoc #

Diagnostic e => Outputable (Messages e) 
Instance details

Defined in GHC.Types.Error

Methods

ppr :: Messages e -> SDoc #

Outputable a => Outputable (OccEnv a) 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

ppr :: OccEnv a -> SDoc #

Outputable e => Outputable (Located e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: Located e -> SDoc #

Outputable a => Outputable (UniqDSet a) 
Instance details

Defined in GHC.Types.Unique.DSet

Methods

ppr :: UniqDSet a -> SDoc #

Outputable a => Outputable (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

ppr :: UniqSet a -> SDoc #

Outputable (UnitEnvGraph HomeUnitEnv) 
Instance details

Defined in GHC.Unit.Env

Methods

ppr :: UnitEnvGraph HomeUnitEnv -> SDoc #

Outputable elt => Outputable (InstalledModuleEnv elt) 
Instance details

Defined in GHC.Unit.Module.Env

Methods

ppr :: InstalledModuleEnv elt -> SDoc #

Outputable a => Outputable (ModuleEnv a) 
Instance details

Defined in GHC.Unit.Module.Env

Methods

ppr :: ModuleEnv a -> SDoc #

Outputable (WarningTxt pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

ppr :: WarningTxt pass -> SDoc #

Outputable u => Outputable (UnitDatabase u) 
Instance details

Defined in GHC.Unit.State

Methods

ppr :: UnitDatabase u -> SDoc #

Outputable unit => Outputable (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Definite unit -> SDoc #

Outputable a => Outputable (GenWithIsBoot a) 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: GenWithIsBoot a -> SDoc #

Outputable a => Outputable (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Maybe a -> SDoc #

Outputable a => Outputable [a] 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: [a] -> SDoc #

(Outputable a, Outputable b) => Outputable (Either a b) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Either a b -> SDoc #

(Outputable key, Outputable elt) => Outputable (Map key elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Map key elt -> SDoc #

(Outputable a, Outputable (m a)) => Outputable (GenMap m a) 
Instance details

Defined in GHC.Data.TrieMap

Methods

ppr :: GenMap m a -> SDoc #

(TrieMap m, Outputable a) => Outputable (ListMap m a) 
Instance details

Defined in GHC.Data.TrieMap

Methods

ppr :: ListMap m a -> SDoc #

Outputable a => Outputable (WithHsDocIdentifiers a pass) 
Instance details

Defined in GHC.Hs.Doc

Methods

ppr :: WithHsDocIdentifiers a pass -> SDoc #

(Outputable a, Outputable b) => Outputable (HsExpansion a b) 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: HsExpansion a b -> SDoc #

(Outputable a, Outputable b) => Outputable (HsPatExpansion a b) 
Instance details

Defined in GHC.Hs.Pat

Methods

ppr :: HsPatExpansion a b -> SDoc #

(Outputable r, Outputable b) => Outputable (IfaceBindingX r b) 
Instance details

Defined in GHC.Iface.Syntax

Methods

ppr :: IfaceBindingX r b -> SDoc #

Outputable (GenLocated Anchor EpaComment) 
Instance details

Defined in GHC.Parser.Annotation

(Outputable a, Outputable e) => Outputable (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: GenLocated (SrcSpanAnn' a) e -> SDoc #

Outputable a => Outputable (GenLocated TokenLocation a) 
Instance details

Defined in GHC.Parser.Annotation

Outputable e => Outputable (GenLocated RealSrcSpan e) 
Instance details

Defined in GHC.Types.SrcLoc

Outputable a => Outputable (UniqDFM key a) 
Instance details

Defined in GHC.Types.Unique.DFM

Methods

ppr :: UniqDFM key a -> SDoc #

Outputable a => Outputable (UniqFM key a) 
Instance details

Defined in GHC.Types.Unique.FM

Methods

ppr :: UniqFM key a -> SDoc #

OutputableBndr tv => Outputable (VarBndr tv TyConBndrVis) 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: VarBndr tv TyConBndrVis -> SDoc #

Outputable tv => Outputable (VarBndr tv ForAllTyFlag) 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: VarBndr tv ForAllTyFlag -> SDoc #

Outputable tv => Outputable (VarBndr tv Specificity) 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: VarBndr tv Specificity -> SDoc #

(Outputable a, Outputable b) => Outputable (a, b) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b) -> SDoc #

(Outputable a, Outputable b, Outputable c) => Outputable (a, b, c) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b, c) -> SDoc #

(Outputable a, Outputable b, Outputable c, Outputable d) => Outputable (a, b, c, d) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b, c, d) -> SDoc #

(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e) => Outputable (a, b, c, d, e) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b, c, d, e) -> SDoc #

(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e, Outputable f) => Outputable (a, b, c, d, e, f) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b, c, d, e, f) -> SDoc #

(Outputable a, Outputable b, Outputable c, Outputable d, Outputable e, Outputable f, Outputable g) => Outputable (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: (a, b, c, d, e, f, g) -> SDoc #

data Bag a #

Instances

Instances details
Foldable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fold :: Monoid m => Bag m -> m

foldMap :: Monoid m => (a -> m) -> Bag a -> m

foldMap' :: Monoid m => (a -> m) -> Bag a -> m

foldr :: (a -> b -> b) -> b -> Bag a -> b

foldr' :: (a -> b -> b) -> b -> Bag a -> b

foldl :: (b -> a -> b) -> b -> Bag a -> b

foldl' :: (b -> a -> b) -> b -> Bag a -> b

foldr1 :: (a -> a -> a) -> Bag a -> a

foldl1 :: (a -> a -> a) -> Bag a -> a

toList :: Bag a -> [a]

null :: Bag a -> Bool

length :: Bag a -> Int

elem :: Eq a => a -> Bag a -> Bool

maximum :: Ord a => Bag a -> a

minimum :: Ord a => Bag a -> a

sum :: Num a => Bag a -> a

product :: Num a => Bag a -> a

Traversable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

traverse :: Applicative f => (a -> f b) -> Bag a -> f (Bag b)

sequenceA :: Applicative f => Bag (f a) -> f (Bag a)

mapM :: Monad m => (a -> m b) -> Bag a -> m (Bag b)

sequence :: Monad m => Bag (m a) -> m (Bag a)

Functor Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fmap :: (a -> b) -> Bag a -> Bag b

(<$) :: a -> Bag b -> Bag a

Data a => Data (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bag a -> c (Bag a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Bag a)

toConstr :: Bag a -> Constr

dataTypeOf :: Bag a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Bag a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Bag a))

gmapT :: (forall b. Data b => b -> b) -> Bag a -> Bag a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r

gmapQ :: (forall d. Data d => d -> u) -> Bag a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bag a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a)

Monoid (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

mempty :: Bag a

mappend :: Bag a -> Bag a -> Bag a

mconcat :: [Bag a] -> Bag a

Semigroup (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

(<>) :: Bag a -> Bag a -> Bag a

sconcat :: NonEmpty (Bag a) -> Bag a

stimes :: Integral b => b -> Bag a -> Bag a

IsList (Bag a) 
Instance details

Defined in GHC.Data.Bag

Associated Types

type Item (Bag a)

Methods

fromList :: [Item (Bag a)] -> Bag a

fromListN :: Int -> [Item (Bag a)] -> Bag a

toList :: Bag a -> [Item (Bag a)]

NFData a => NFData (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

rnf :: Bag a -> ()

Outputable a => Outputable (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

ppr :: Bag a -> SDoc #

type Item (Bag a) 
Instance details

Defined in GHC.Data.Bag

type Item (Bag a) = a

type Id = Var #

data InstEnv #

Instances

Instances details
Outputable InstEnv 
Instance details

Defined in GHC.Core.InstEnv

Methods

ppr :: InstEnv -> SDoc #

type TcType = Type #

data Type #

Instances

Instances details
Data Type 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type

toConstr :: Type -> Constr

dataTypeOf :: Type -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type)

gmapT :: (forall b. Data b => b -> b) -> Type -> Type

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r

gmapQ :: (forall d. Data d => d -> u) -> Type -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type

Outputable Type 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Type -> SDoc #

Eq (DeBruijn Type) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Type -> DeBruijn Type -> Bool

(/=) :: DeBruijn Type -> DeBruijn Type -> Bool

data TyCon #

Instances

Instances details
Data TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyCon -> c TyCon

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TyCon

toConstr :: TyCon -> Constr

dataTypeOf :: TyCon -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TyCon)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TyCon)

gmapT :: (forall b. Data b => b -> b) -> TyCon -> TyCon

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyCon -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyCon -> r

gmapQ :: (forall d. Data d => d -> u) -> TyCon -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyCon -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyCon -> m TyCon

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyCon -> m TyCon

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyCon -> m TyCon

NamedThing TyCon 
Instance details

Defined in GHC.Core.TyCon

Uniquable TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

getUnique :: TyCon -> Unique #

Outputable TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: TyCon -> SDoc #

Eq TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: TyCon -> TyCon -> Bool

(/=) :: TyCon -> TyCon -> Bool

data PkgQual #

Instances

Instances details
Data PkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgQual -> c PkgQual

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgQual

toConstr :: PkgQual -> Constr

dataTypeOf :: PkgQual -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgQual)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgQual)

gmapT :: (forall b. Data b => b -> b) -> PkgQual -> PkgQual

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgQual -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgQual -> r

gmapQ :: (forall d. Data d => d -> u) -> PkgQual -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgQual -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgQual -> m PkgQual

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgQual -> m PkgQual

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgQual -> m PkgQual

Outputable PkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

ppr :: PkgQual -> SDoc #

Eq PkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

(==) :: PkgQual -> PkgQual -> Bool

(/=) :: PkgQual -> PkgQual -> Bool

Ord PkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

compare :: PkgQual -> PkgQual -> Ordering

(<) :: PkgQual -> PkgQual -> Bool

(<=) :: PkgQual -> PkgQual -> Bool

(>) :: PkgQual -> PkgQual -> Bool

(>=) :: PkgQual -> PkgQual -> Bool

max :: PkgQual -> PkgQual -> PkgQual

min :: PkgQual -> PkgQual -> PkgQual

data Origin #

Constructors

FromSource 
Generated 

Instances

Instances details
Data Origin 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Origin -> c Origin

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Origin

toConstr :: Origin -> Constr

dataTypeOf :: Origin -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Origin)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Origin)

gmapT :: (forall b. Data b => b -> b) -> Origin -> Origin

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Origin -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Origin -> r

gmapQ :: (forall d. Data d => d -> u) -> Origin -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Origin -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Origin -> m Origin

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Origin -> m Origin

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Origin -> m Origin

Outputable Origin 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Origin -> SDoc #

Eq Origin 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Origin -> Origin -> Bool

(/=) :: Origin -> Origin -> Bool

data IORef a #

Instances

Instances details
NFData1 IORef 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> ()

NFData (IORef a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> ()

Eq (IORef a) 
Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool

(/=) :: IORef a -> IORef a -> Bool

(MonadIO m, MonadMask m) => CommandMonad (InputCmdT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

runCompletion :: (String, String) -> InputCmdT m (String, [Completion])

class Functor f => Applicative (f :: Type -> Type) where #

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

(<*>) :: f (a -> b) -> f a -> f b #

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

(*>) :: f a -> f b -> f b #

(<*) :: f a -> f b -> f a #

Instances

Instances details
Applicative ZipList 
Instance details

Defined in Control.Applicative

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative First 
Instance details

Defined in Data.Monoid

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last 
Instance details

Defined in Data.Monoid

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

(<*>) :: Dual (a -> b) -> Dual a -> Dual b #

liftA2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

(*>) :: Dual a -> Dual b -> Dual b #

(<*) :: Dual a -> Dual b -> Dual a #

Applicative Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Product a #

(<*>) :: Product (a -> b) -> Product a -> Product b #

liftA2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

(*>) :: Product a -> Product b -> Product b #

(<*) :: Product a -> Product b -> Product a #

Applicative Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

(<*>) :: Sum (a -> b) -> Sum a -> Sum b #

liftA2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

(*>) :: Sum a -> Sum b -> Sum b #

(<*) :: Sum a -> Sum b -> Sum a #

Applicative NonEmpty 
Instance details

Defined in GHC.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Applicative Par1 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative NormM 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

pure :: a -> NormM a #

(<*>) :: NormM (a -> b) -> NormM a -> NormM b #

liftA2 :: (a -> b -> c) -> NormM a -> NormM b -> NormM c #

(*>) :: NormM a -> NormM b -> NormM b #

(<*) :: NormM a -> NormM b -> NormM a #

Applicative CoreM 
Instance details

Defined in GHC.Core.Opt.Monad

Methods

pure :: a -> CoreM a #

(<*>) :: CoreM (a -> b) -> CoreM a -> CoreM b #

liftA2 :: (a -> b -> c) -> CoreM a -> CoreM b -> CoreM c #

(*>) :: CoreM a -> CoreM b -> CoreM b #

(<*) :: CoreM a -> CoreM b -> CoreM a #

Applicative UM 
Instance details

Defined in GHC.Core.Unify

Methods

pure :: a -> UM a #

(<*>) :: UM (a -> b) -> UM a -> UM b #

liftA2 :: (a -> b -> c) -> UM a -> UM b -> UM c #

(*>) :: UM a -> UM b -> UM b #

(<*) :: UM a -> UM b -> UM a #

Applicative UnifyResultM 
Instance details

Defined in GHC.Core.Unify

Methods

pure :: a -> UnifyResultM a #

(<*>) :: UnifyResultM (a -> b) -> UnifyResultM a -> UnifyResultM b #

liftA2 :: (a -> b -> c) -> UnifyResultM a -> UnifyResultM b -> UnifyResultM c #

(*>) :: UnifyResultM a -> UnifyResultM b -> UnifyResultM b #

(<*) :: UnifyResultM a -> UnifyResultM b -> UnifyResultM a #

Applicative Infinite 
Instance details

Defined in GHC.Data.List.Infinite

Methods

pure :: a -> Infinite a #

(<*>) :: Infinite (a -> b) -> Infinite a -> Infinite b #

liftA2 :: (a -> b -> c) -> Infinite a -> Infinite b -> Infinite c #

(*>) :: Infinite a -> Infinite b -> Infinite b #

(<*) :: Infinite a -> Infinite b -> Infinite a #

Applicative Maybe 
Instance details

Defined in GHC.Data.Strict

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Hsc 
Instance details

Defined in GHC.Driver.Env.Types

Methods

pure :: a -> Hsc a #

(<*>) :: Hsc (a -> b) -> Hsc a -> Hsc b #

liftA2 :: (a -> b -> c) -> Hsc a -> Hsc b -> Hsc c #

(*>) :: Hsc a -> Hsc b -> Hsc b #

(<*) :: Hsc a -> Hsc b -> Hsc a #

Applicative PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

pure :: a -> PV a #

(<*>) :: PV (a -> b) -> PV a -> PV b #

liftA2 :: (a -> b -> c) -> PV a -> PV b -> PV c #

(*>) :: PV a -> PV b -> PV b #

(<*) :: PV a -> PV b -> PV a #

Applicative TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

pure :: a -> TcS a #

(<*>) :: TcS (a -> b) -> TcS a -> TcS b #

liftA2 :: (a -> b -> c) -> TcS a -> TcS b -> TcS c #

(*>) :: TcS a -> TcS b -> TcS b #

(<*) :: TcS a -> TcS b -> TcS a #

Applicative TcPluginM 
Instance details

Defined in GHC.Tc.Types

Methods

pure :: a -> TcPluginM a #

(<*>) :: TcPluginM (a -> b) -> TcPluginM a -> TcPluginM b #

liftA2 :: (a -> b -> c) -> TcPluginM a -> TcPluginM b -> TcPluginM c #

(*>) :: TcPluginM a -> TcPluginM b -> TcPluginM b #

(<*) :: TcPluginM a -> TcPluginM b -> TcPluginM a #

Applicative UniqSM 
Instance details

Defined in GHC.Types.Unique.Supply

Methods

pure :: a -> UniqSM a #

(<*>) :: UniqSM (a -> b) -> UniqSM a -> UniqSM b #

liftA2 :: (a -> b -> c) -> UniqSM a -> UniqSM b -> UniqSM c #

(*>) :: UniqSM a -> UniqSM b -> UniqSM b #

(<*) :: UniqSM a -> UniqSM b -> UniqSM a #

Applicative IO 
Instance details

Defined in GHC.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Applicative Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative Maybe 
Instance details

Defined in GHC.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Solo 
Instance details

Defined in GHC.Base

Methods

pure :: a -> Solo a #

(<*>) :: Solo (a -> b) -> Solo a -> Solo b #

liftA2 :: (a -> b -> c) -> Solo a -> Solo b -> Solo c #

(*>) :: Solo a -> Solo b -> Solo b #

(<*) :: Solo a -> Solo b -> Solo a #

Applicative List 
Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [a] #

Monad m => Applicative (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Arrow a => Applicative (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Applicative (Either e) 
Instance details

Defined in Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Applicative (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Applicative (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Applicative (SetM s) 
Instance details

Defined in Data.Graph

Methods

pure :: a -> SetM s a #

(<*>) :: SetM s (a -> b) -> SetM s a -> SetM s b #

liftA2 :: (a -> b -> c) -> SetM s a -> SetM s b -> SetM s c #

(*>) :: SetM s a -> SetM s b -> SetM s b #

(<*) :: SetM s a -> SetM s b -> SetM s a #

Applicative (IOEnv m) 
Instance details

Defined in GHC.Data.IOEnv

Methods

pure :: a -> IOEnv m a #

(<*>) :: IOEnv m (a -> b) -> IOEnv m a -> IOEnv m b #

liftA2 :: (a -> b -> c) -> IOEnv m a -> IOEnv m b -> IOEnv m c #

(*>) :: IOEnv m a -> IOEnv m b -> IOEnv m b #

(<*) :: IOEnv m a -> IOEnv m b -> IOEnv m a #

Applicative (MaybeErr err) 
Instance details

Defined in GHC.Data.Maybe

Methods

pure :: a -> MaybeErr err a #

(<*>) :: MaybeErr err (a -> b) -> MaybeErr err a -> MaybeErr err b #

liftA2 :: (a -> b -> c) -> MaybeErr err a -> MaybeErr err b -> MaybeErr err c #

(*>) :: MaybeErr err a -> MaybeErr err b -> MaybeErr err b #

(<*) :: MaybeErr err a -> MaybeErr err b -> MaybeErr err a #

Applicative (CmdLineP s) 
Instance details

Defined in GHC.Driver.Session

Methods

pure :: a -> CmdLineP s a #

(<*>) :: CmdLineP s (a -> b) -> CmdLineP s a -> CmdLineP s b #

liftA2 :: (a -> b -> c) -> CmdLineP s a -> CmdLineP s b -> CmdLineP s c #

(*>) :: CmdLineP s a -> CmdLineP s b -> CmdLineP s b #

(<*) :: CmdLineP s a -> CmdLineP s b -> CmdLineP s a #

Applicative m => Applicative (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

pure :: a -> InputT m a #

(<*>) :: InputT m (a -> b) -> InputT m a -> InputT m b #

liftA2 :: (a -> b -> c) -> InputT m a -> InputT m b -> InputT m c #

(*>) :: InputT m a -> InputT m b -> InputT m b #

(<*) :: InputT m a -> InputT m b -> InputT m a #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

Monoid a => Applicative ((,) a) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Arrow a => Applicative (WrappedArrow a b) 
Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Applicative m => Applicative (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

pure :: a0 -> Kleisli m a a0 #

(<*>) :: Kleisli m a (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

liftA2 :: (a0 -> b -> c) -> Kleisli m a a0 -> Kleisli m a b -> Kleisli m a c #

(*>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

(<*) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a a0 #

Applicative f => Applicative (Ap f) 
Instance details

Defined in Data.Monoid

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

liftA2 :: (a -> b -> c) -> Ap f a -> Ap f b -> Ap f c #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

Applicative f => Applicative (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Generically1 f a #

(<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b #

liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c #

(*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b #

(<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a #

Applicative f => Applicative (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

(Applicative f, Monad f) => Applicative (WhenMissing f x) 
Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

pure :: a -> AccumT w m a #

(<*>) :: AccumT w m (a -> b) -> AccumT w m a -> AccumT w m b #

liftA2 :: (a -> b -> c) -> AccumT w m a -> AccumT w m b -> AccumT w m c #

(*>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

(<*) :: AccumT w m a -> AccumT w m b -> AccumT w m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Functor m, Monad m) => Applicative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

pure :: a -> SelectT r m a #

(<*>) :: SelectT r m (a -> b) -> SelectT r m a -> SelectT r m b #

liftA2 :: (a -> b -> c) -> SelectT r m a -> SelectT r m b -> SelectT r m c #

(*>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

(<*) :: SelectT r m a -> SelectT r m b -> SelectT r m a #

(Functor m, Monad m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

(Monoid a, Monoid b) => Applicative ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

Monoid c => Applicative (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y) 
Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Applicative (WhenMissing f k x) 
Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, c, a0) #

(<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) #

(*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

(<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) #

Applicative ((->) r) 
Instance details

Defined in GHC.Base

Methods

pure :: a -> r -> a #

(<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b #

liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c #

(*>) :: (r -> a) -> (r -> b) -> r -> b #

(<*) :: (r -> a) -> (r -> b) -> r -> a #

(Applicative f, Applicative g) => Applicative (f :.: g) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

Applicative f => Applicative (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y) 
Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMatched f k x y a #

(<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c #

(*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

(<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a #

newtype LexicalFastString #

Instances

Instances details
Data LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LexicalFastString -> c LexicalFastString

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LexicalFastString

toConstr :: LexicalFastString -> Constr

dataTypeOf :: LexicalFastString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LexicalFastString)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LexicalFastString)

gmapT :: (forall b. Data b => b -> b) -> LexicalFastString -> LexicalFastString

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFastString -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFastString -> r

gmapQ :: (forall d. Data d => d -> u) -> LexicalFastString -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LexicalFastString -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFastString -> m LexicalFastString

Show LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> LexicalFastString -> ShowS

show :: LexicalFastString -> String

showList :: [LexicalFastString] -> ShowS

Outputable LexicalFastString 
Instance details

Defined in GHC.Utils.Outputable

Eq LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Ord LexicalFastString 
Instance details

Defined in GHC.Data.FastString

data Levity #

Constructors

Lifted 
Unlifted 

Instances

Instances details
Outputable Levity 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Levity -> SDoc #

Eq Levity 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Levity -> Levity -> Bool

(/=) :: Levity -> Levity -> Bool

type IfM lcl = TcRnIf IfGblEnv lcl #

data TcGblEnv #

Constructors

TcGblEnv 

Fields

Instances

Instances details
ContainsModule TcGblEnv 
Instance details

Defined in GHC.Tc.Types

type TcM = TcRn #

type LHsExpr p = XRec p (HsExpr p) #

newtype ModuleName #

Constructors

ModuleName FastString 

Instances

Instances details
Data ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleName -> c ModuleName

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleName

toConstr :: ModuleName -> Constr

dataTypeOf :: ModuleName -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleName)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleName)

gmapT :: (forall b. Data b => b -> b) -> ModuleName -> ModuleName

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r

gmapQ :: (forall d. Data d => d -> u) -> ModuleName -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleName -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName

Show ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

showsPrec :: Int -> ModuleName -> ShowS

show :: ModuleName -> String

showList :: [ModuleName] -> ShowS

NFData ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

rnf :: ModuleName -> ()

Uniquable ModuleName 
Instance details

Defined in GHC.Types.Unique

Outputable ModuleName 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: ModuleName -> SDoc #

Eq ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

(==) :: ModuleName -> ModuleName -> Bool

(/=) :: ModuleName -> ModuleName -> Bool

Ord ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

type Anno ModuleName 
Instance details

Defined in GHC.Hs

type Anno ModuleName 
Instance details

Defined in GHC.Hs.ImpExp

data PluginRecompile #

Constructors

ForceRecompile 
NoForceRecompile 
MaybeRecompile Fingerprint 

Instances

Instances details
Monoid PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Semigroup PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Outputable PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Methods

ppr :: PluginRecompile -> SDoc #

type CommandLineOption = String #

type CorePlugin = [CommandLineOption] -> [CoreToDo] -> CoreM [CoreToDo] #

data ExternalPlugin #

Constructors

ExternalPlugin 

Fields

type FrontendPluginAction = [String] -> [(String, Maybe Phase)] -> Ghc () #

data LoadedPlugin #

Constructors

LoadedPlugin 

Fields

data ParsedResult #

Constructors

ParsedResult 

Fields

data PsMessages #

Constructors

PsMessages 

Fields

data StaticPlugin #

Constructors

StaticPlugin 

data GenLocated l e #

Constructors

L l e 

Instances

Instances details
Foldable (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

fold :: Monoid m => GenLocated l m -> m

foldMap :: Monoid m => (a -> m) -> GenLocated l a -> m

foldMap' :: Monoid m => (a -> m) -> GenLocated l a -> m

foldr :: (a -> b -> b) -> b -> GenLocated l a -> b

foldr' :: (a -> b -> b) -> b -> GenLocated l a -> b

foldl :: (b -> a -> b) -> b -> GenLocated l a -> b

foldl' :: (b -> a -> b) -> b -> GenLocated l a -> b

foldr1 :: (a -> a -> a) -> GenLocated l a -> a

foldl1 :: (a -> a -> a) -> GenLocated l a -> a

toList :: GenLocated l a -> [a]

null :: GenLocated l a -> Bool

length :: GenLocated l a -> Int

elem :: Eq a => a -> GenLocated l a -> Bool

maximum :: Ord a => GenLocated l a -> a

minimum :: Ord a => GenLocated l a -> a

sum :: Num a => GenLocated l a -> a

product :: Num a => GenLocated l a -> a

Traversable (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

traverse :: Applicative f => (a -> f b) -> GenLocated l a -> f (GenLocated l b)

sequenceA :: Applicative f => GenLocated l (f a) -> f (GenLocated l a)

mapM :: Monad m => (a -> m b) -> GenLocated l a -> m (GenLocated l b)

sequence :: Monad m => GenLocated l (m a) -> m (GenLocated l a)

Functor (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

fmap :: (a -> b) -> GenLocated l a -> GenLocated l b

(<$) :: a -> GenLocated l b -> GenLocated l a

NamedThing e => NamedThing (Located e) 
Instance details

Defined in GHC.Types.Name

Outputable e => Outputable (Located e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: Located e -> SDoc #

(Data l, Data e) => Data (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenLocated l e -> c (GenLocated l e)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenLocated l e)

toConstr :: GenLocated l e -> Constr

dataTypeOf :: GenLocated l e -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenLocated l e))

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (GenLocated l e))

gmapT :: (forall b. Data b => b -> b) -> GenLocated l e -> GenLocated l e

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenLocated l e -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenLocated l e -> r

gmapQ :: (forall d. Data d => d -> u) -> GenLocated l e -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenLocated l e -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e)

(Show l, Show e) => Show (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> GenLocated l e -> ShowS

show :: GenLocated l e -> String

showList :: [GenLocated l e] -> ShowS

(NFData l, NFData e) => NFData (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

rnf :: GenLocated l e -> ()

NamedThing (Located a) => NamedThing (LocatedAn an a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

getOccName :: LocatedAn an a -> OccName #

getName :: LocatedAn an a -> Name #

Outputable (GenLocated Anchor EpaComment) 
Instance details

Defined in GHC.Parser.Annotation

(Outputable a, Outputable e) => Outputable (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: GenLocated (SrcSpanAnn' a) e -> SDoc #

Outputable a => Outputable (GenLocated TokenLocation a) 
Instance details

Defined in GHC.Parser.Annotation

Outputable e => Outputable (GenLocated RealSrcSpan e) 
Instance details

Defined in GHC.Types.SrcLoc

(Outputable a, OutputableBndr e) => OutputableBndr (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

(Eq l, Eq e) => Eq (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: GenLocated l e -> GenLocated l e -> Bool

(/=) :: GenLocated l e -> GenLocated l e -> Bool

(Ord l, Ord e) => Ord (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: GenLocated l e -> GenLocated l e -> Ordering

(<) :: GenLocated l e -> GenLocated l e -> Bool

(<=) :: GenLocated l e -> GenLocated l e -> Bool

(>) :: GenLocated l e -> GenLocated l e -> Bool

(>=) :: GenLocated l e -> GenLocated l e -> Bool

max :: GenLocated l e -> GenLocated l e -> GenLocated l e

min :: GenLocated l e -> GenLocated l e -> GenLocated l e

type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) = SrcSpan
type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] = SrcSpan
type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data HsExpr p #

Constructors

HsVar (XVar p) (LIdP p) 
HsUnboundVar (XUnboundVar p) RdrName 
HsRecSel (XRecSel p) (FieldOcc p) 
HsOverLabel (XOverLabel p) SourceText FastString 
HsIPVar (XIPVar p) HsIPName 
HsOverLit (XOverLitE p) (HsOverLit p) 
HsLit (XLitE p) (HsLit p) 
HsLam (XLam p) (MatchGroup p (LHsExpr p)) 
HsLamCase (XLamCase p) LamCaseVariant (MatchGroup p (LHsExpr p)) 
HsApp (XApp p) (LHsExpr p) (LHsExpr p) 
HsAppType (XAppTypeE p) (LHsExpr p) !(LHsToken "@" p) (LHsWcType (NoGhcTc p)) 
OpApp (XOpApp p) (LHsExpr p) (LHsExpr p) (LHsExpr p) 
NegApp (XNegApp p) (LHsExpr p) (SyntaxExpr p) 
HsPar (XPar p) !(LHsToken "(" p) (LHsExpr p) !(LHsToken ")" p) 
SectionL (XSectionL p) (LHsExpr p) (LHsExpr p) 
SectionR (XSectionR p) (LHsExpr p) (LHsExpr p) 
ExplicitTuple (XExplicitTuple p) [HsTupArg p] Boxity 
ExplicitSum (XExplicitSum p) ConTag SumWidth (LHsExpr p) 
HsCase (XCase p) (LHsExpr p) (MatchGroup p (LHsExpr p)) 
HsIf (XIf p) (LHsExpr p) (LHsExpr p) (LHsExpr p) 
HsMultiIf (XMultiIf p) [LGRHS p (LHsExpr p)] 
HsLet (XLet p) !(LHsToken "let" p) (HsLocalBinds p) !(LHsToken "in" p) (LHsExpr p) 
HsDo (XDo p) HsDoFlavour (XRec p [ExprLStmt p]) 
ExplicitList (XExplicitList p) [LHsExpr p] 
RecordCon 
RecordUpd 
HsGetField 

Fields

HsProjection 

Fields

ExprWithTySig (XExprWithTySig p) (LHsExpr p) (LHsSigWcType (NoGhcTc p)) 
ArithSeq (XArithSeq p) (Maybe (SyntaxExpr p)) (ArithSeqInfo p) 
HsTypedBracket (XTypedBracket p) (LHsExpr p) 
HsUntypedBracket (XUntypedBracket p) (HsQuote p) 
HsTypedSplice (XTypedSplice p) (LHsExpr p) 
HsUntypedSplice (XUntypedSplice p) (HsUntypedSplice p) 
HsProc (XProc p) (LPat p) (LHsCmdTop p) 
HsStatic (XStatic p) (LHsExpr p) 
HsPragE (XPragE p) (HsPragE p) (LHsExpr p) 
XExpr !(XXExpr p) 

Instances

Instances details
DisambECP (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Associated Types

type Body (HsExpr GhcPs) :: Type -> Type

type InfixOp (HsExpr GhcPs)

type FunArg (HsExpr GhcPs)

Methods

ecpFromCmd' :: LHsCmd GhcPs -> PV (LocatedA (HsExpr GhcPs))

ecpFromExp' :: LHsExpr GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsProjUpdatePV :: SrcSpan -> Located [LocatedAn NoEpAnns (DotFieldOcc GhcPs)] -> LocatedA (HsExpr GhcPs) -> Bool -> [AddEpAnn] -> PV (LHsRecProj GhcPs (LocatedA (HsExpr GhcPs)))

mkHsLamPV :: SrcSpan -> (EpAnnComments -> MatchGroup GhcPs (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsLetPV :: SrcSpan -> LHsToken "let" GhcPs -> HsLocalBinds GhcPs -> LHsToken "in" GhcPs -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

superInfixOp :: (DisambInfixOp (InfixOp (HsExpr GhcPs)) => PV (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsOpAppPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> LocatedN (InfixOp (HsExpr GhcPs)) -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

mkHsCasePV :: SrcSpan -> LHsExpr GhcPs -> LocatedL [LMatch GhcPs (LocatedA (HsExpr GhcPs))] -> EpAnnHsCase -> PV (LocatedA (HsExpr GhcPs))

mkHsLamCasePV :: SrcSpan -> LamCaseVariant -> LocatedL [LMatch GhcPs (LocatedA (HsExpr GhcPs))] -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

superFunArg :: (DisambECP (FunArg (HsExpr GhcPs)) => PV (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsAppPV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LocatedA (FunArg (HsExpr GhcPs)) -> PV (LocatedA (HsExpr GhcPs))

mkHsAppTypePV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LHsToken "@" GhcPs -> LHsType GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsIfPV :: SrcSpan -> LHsExpr GhcPs -> Bool -> LocatedA (HsExpr GhcPs) -> Bool -> LocatedA (HsExpr GhcPs) -> AnnsIf -> PV (LocatedA (HsExpr GhcPs))

mkHsDoPV :: SrcSpan -> Maybe ModuleName -> LocatedL [LStmt GhcPs (LocatedA (HsExpr GhcPs))] -> AnnList -> PV (LocatedA (HsExpr GhcPs))

mkHsParPV :: SrcSpan -> LHsToken "(" GhcPs -> LocatedA (HsExpr GhcPs) -> LHsToken ")" GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsVarPV :: LocatedN RdrName -> PV (LocatedA (HsExpr GhcPs))

mkHsLitPV :: Located (HsLit GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsOverLitPV :: LocatedAn a (HsOverLit GhcPs) -> PV (LocatedAn a (HsExpr GhcPs))

mkHsWildCardPV :: SrcSpan -> PV (Located (HsExpr GhcPs))

mkHsTySigPV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LHsType GhcPs -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsExplicitListPV :: SrcSpan -> [LocatedA (HsExpr GhcPs)] -> AnnList -> PV (LocatedA (HsExpr GhcPs))

mkHsSplicePV :: Located (HsUntypedSplice GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsRecordPV :: Bool -> SrcSpan -> SrcSpan -> LocatedA (HsExpr GhcPs) -> ([Fbind (HsExpr GhcPs)], Maybe SrcSpan) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsNegAppPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsSectionR_PV :: SrcSpan -> LocatedA (InfixOp (HsExpr GhcPs)) -> LocatedA (HsExpr GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsViewPatPV :: SrcSpan -> LHsExpr GhcPs -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsAsPatPV :: SrcSpan -> LocatedN RdrName -> LHsToken "@" GhcPs -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

mkHsLazyPatPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsBangPatPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkSumOrTuplePV :: SrcSpanAnnA -> Boxity -> SumOrTuple (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

rejectPragmaPV :: LocatedA (HsExpr GhcPs) -> PV ()

DisambInfixOp (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (HsExpr GhcPs) = HsExpr
type FunArg (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type FunArg (HsExpr GhcPs) = HsExpr GhcPs
type InfixOp (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type InfixOp (HsExpr GhcPs) = HsExpr GhcPs
type Anno (HsExpr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

data GhcPass (c :: Pass) where #

Instances

Instances details
Typeable p => Data (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GhcPass p -> c (GhcPass p)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GhcPass p)

toConstr :: GhcPass p -> Constr

dataTypeOf :: GhcPass p -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GhcPass p))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GhcPass p))

gmapT :: (forall b. Data b => b -> b) -> GhcPass p -> GhcPass p

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GhcPass p -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GhcPass p -> r

gmapQ :: (forall d. Data d => d -> u) -> GhcPass p -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> GhcPass p -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p)

Typeable p => Data (LayoutInfo (GhcPass p)) 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LayoutInfo (GhcPass p) -> c (LayoutInfo (GhcPass p))

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LayoutInfo (GhcPass p))

toConstr :: LayoutInfo (GhcPass p) -> Constr

dataTypeOf :: LayoutInfo (GhcPass p) -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (LayoutInfo (GhcPass p)))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LayoutInfo (GhcPass p)))

gmapT :: (forall b. Data b => b -> b) -> LayoutInfo (GhcPass p) -> LayoutInfo (GhcPass p)

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r

gmapQ :: (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

IsPass p => CollectPass (GhcPass p) 
Instance details

Defined in GHC.Hs.Utils

DisambECP (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Associated Types

type Body (PatBuilder GhcPs) :: Type -> Type

type InfixOp (PatBuilder GhcPs)

type FunArg (PatBuilder GhcPs)

Methods

ecpFromCmd' :: LHsCmd GhcPs -> PV (LocatedA (PatBuilder GhcPs))

ecpFromExp' :: LHsExpr GhcPs -> PV (LocatedA (PatBuilder GhcPs))

mkHsProjUpdatePV :: SrcSpan -> Located [LocatedAn NoEpAnns (DotFieldOcc GhcPs)] -> LocatedA (PatBuilder GhcPs) -> Bool -> [AddEpAnn] -> PV (LHsRecProj GhcPs (LocatedA (PatBuilder GhcPs)))

mkHsLamPV :: SrcSpan -> (EpAnnComments -> MatchGroup GhcPs (LocatedA (PatBuilder GhcPs))) -> PV (LocatedA (PatBuilder GhcPs))

mkHsLetPV :: SrcSpan -> LHsToken "let" GhcPs -> HsLocalBinds GhcPs -> LHsToken "in" GhcPs -> LocatedA (PatBuilder GhcPs) -> PV (LocatedA (PatBuilder GhcPs))

superInfixOp :: (DisambInfixOp (InfixOp (PatBuilder GhcPs)) => PV (LocatedA (PatBuilder GhcPs))) -> PV (LocatedA (PatBuilder GhcPs))

mkHsOpAppPV :: SrcSpan -> LocatedA (PatBuilder GhcPs) -> LocatedN (InfixOp (PatBuilder GhcPs)) -> LocatedA (PatBuilder GhcPs) -> PV (LocatedA (PatBuilder GhcPs))

mkHsCasePV :: SrcSpan -> LHsExpr GhcPs -> LocatedL [LMatch GhcPs (LocatedA (PatBuilder GhcPs))] -> EpAnnHsCase -> PV (LocatedA (PatBuilder GhcPs))

mkHsLamCasePV :: SrcSpan -> LamCaseVariant -> LocatedL [LMatch GhcPs (LocatedA (PatBuilder GhcPs))] -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

superFunArg :: (DisambECP (FunArg (PatBuilder GhcPs)) => PV (LocatedA (PatBuilder GhcPs))) -> PV (LocatedA (PatBuilder GhcPs))

mkHsAppPV :: SrcSpanAnnA -> LocatedA (PatBuilder GhcPs) -> LocatedA (FunArg (PatBuilder GhcPs)) -> PV (LocatedA (PatBuilder GhcPs))

mkHsAppTypePV :: SrcSpanAnnA -> LocatedA (PatBuilder GhcPs) -> LHsToken "@" GhcPs -> LHsType GhcPs -> PV (LocatedA (PatBuilder GhcPs))

mkHsIfPV :: SrcSpan -> LHsExpr GhcPs -> Bool -> LocatedA (PatBuilder GhcPs) -> Bool -> LocatedA (PatBuilder GhcPs) -> AnnsIf -> PV (LocatedA (PatBuilder GhcPs))

mkHsDoPV :: SrcSpan -> Maybe ModuleName -> LocatedL [LStmt GhcPs (LocatedA (PatBuilder GhcPs))] -> AnnList -> PV (LocatedA (PatBuilder GhcPs))

mkHsParPV :: SrcSpan -> LHsToken "(" GhcPs -> LocatedA (PatBuilder GhcPs) -> LHsToken ")" GhcPs -> PV (LocatedA (PatBuilder GhcPs))

mkHsVarPV :: LocatedN RdrName -> PV (LocatedA (PatBuilder GhcPs))

mkHsLitPV :: Located (HsLit GhcPs) -> PV (Located (PatBuilder GhcPs))

mkHsOverLitPV :: LocatedAn a (HsOverLit GhcPs) -> PV (LocatedAn a (PatBuilder GhcPs))

mkHsWildCardPV :: SrcSpan -> PV (Located (PatBuilder GhcPs))

mkHsTySigPV :: SrcSpanAnnA -> LocatedA (PatBuilder GhcPs) -> LHsType GhcPs -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkHsExplicitListPV :: SrcSpan -> [LocatedA (PatBuilder GhcPs)] -> AnnList -> PV (LocatedA (PatBuilder GhcPs))

mkHsSplicePV :: Located (HsUntypedSplice GhcPs) -> PV (Located (PatBuilder GhcPs))

mkHsRecordPV :: Bool -> SrcSpan -> SrcSpan -> LocatedA (PatBuilder GhcPs) -> ([Fbind (PatBuilder GhcPs)], Maybe SrcSpan) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkHsNegAppPV :: SrcSpan -> LocatedA (PatBuilder GhcPs) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkHsSectionR_PV :: SrcSpan -> LocatedA (InfixOp (PatBuilder GhcPs)) -> LocatedA (PatBuilder GhcPs) -> PV (Located (PatBuilder GhcPs))

mkHsViewPatPV :: SrcSpan -> LHsExpr GhcPs -> LocatedA (PatBuilder GhcPs) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkHsAsPatPV :: SrcSpan -> LocatedN RdrName -> LHsToken "@" GhcPs -> LocatedA (PatBuilder GhcPs) -> PV (LocatedA (PatBuilder GhcPs))

mkHsLazyPatPV :: SrcSpan -> LocatedA (PatBuilder GhcPs) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkHsBangPatPV :: SrcSpan -> LocatedA (PatBuilder GhcPs) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

mkSumOrTuplePV :: SrcSpanAnnA -> Boxity -> SumOrTuple (PatBuilder GhcPs) -> [AddEpAnn] -> PV (LocatedA (PatBuilder GhcPs))

rejectPragmaPV :: LocatedA (PatBuilder GhcPs) -> PV ()

DisambECP (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Associated Types

type Body (HsCmd GhcPs) :: Type -> Type

type InfixOp (HsCmd GhcPs)

type FunArg (HsCmd GhcPs)

Methods

ecpFromCmd' :: LHsCmd GhcPs -> PV (LocatedA (HsCmd GhcPs))

ecpFromExp' :: LHsExpr GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsProjUpdatePV :: SrcSpan -> Located [LocatedAn NoEpAnns (DotFieldOcc GhcPs)] -> LocatedA (HsCmd GhcPs) -> Bool -> [AddEpAnn] -> PV (LHsRecProj GhcPs (LocatedA (HsCmd GhcPs)))

mkHsLamPV :: SrcSpan -> (EpAnnComments -> MatchGroup GhcPs (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsLetPV :: SrcSpan -> LHsToken "let" GhcPs -> HsLocalBinds GhcPs -> LHsToken "in" GhcPs -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

superInfixOp :: (DisambInfixOp (InfixOp (HsCmd GhcPs)) => PV (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsOpAppPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> LocatedN (InfixOp (HsCmd GhcPs)) -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

mkHsCasePV :: SrcSpan -> LHsExpr GhcPs -> LocatedL [LMatch GhcPs (LocatedA (HsCmd GhcPs))] -> EpAnnHsCase -> PV (LocatedA (HsCmd GhcPs))

mkHsLamCasePV :: SrcSpan -> LamCaseVariant -> LocatedL [LMatch GhcPs (LocatedA (HsCmd GhcPs))] -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

superFunArg :: (DisambECP (FunArg (HsCmd GhcPs)) => PV (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsAppPV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LocatedA (FunArg (HsCmd GhcPs)) -> PV (LocatedA (HsCmd GhcPs))

mkHsAppTypePV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LHsToken "@" GhcPs -> LHsType GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsIfPV :: SrcSpan -> LHsExpr GhcPs -> Bool -> LocatedA (HsCmd GhcPs) -> Bool -> LocatedA (HsCmd GhcPs) -> AnnsIf -> PV (LocatedA (HsCmd GhcPs))

mkHsDoPV :: SrcSpan -> Maybe ModuleName -> LocatedL [LStmt GhcPs (LocatedA (HsCmd GhcPs))] -> AnnList -> PV (LocatedA (HsCmd GhcPs))

mkHsParPV :: SrcSpan -> LHsToken "(" GhcPs -> LocatedA (HsCmd GhcPs) -> LHsToken ")" GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsVarPV :: LocatedN RdrName -> PV (LocatedA (HsCmd GhcPs))

mkHsLitPV :: Located (HsLit GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsOverLitPV :: LocatedAn a (HsOverLit GhcPs) -> PV (LocatedAn a (HsCmd GhcPs))

mkHsWildCardPV :: SrcSpan -> PV (Located (HsCmd GhcPs))

mkHsTySigPV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LHsType GhcPs -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsExplicitListPV :: SrcSpan -> [LocatedA (HsCmd GhcPs)] -> AnnList -> PV (LocatedA (HsCmd GhcPs))

mkHsSplicePV :: Located (HsUntypedSplice GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsRecordPV :: Bool -> SrcSpan -> SrcSpan -> LocatedA (HsCmd GhcPs) -> ([Fbind (HsCmd GhcPs)], Maybe SrcSpan) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsNegAppPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsSectionR_PV :: SrcSpan -> LocatedA (InfixOp (HsCmd GhcPs)) -> LocatedA (HsCmd GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsViewPatPV :: SrcSpan -> LHsExpr GhcPs -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsAsPatPV :: SrcSpan -> LocatedN RdrName -> LHsToken "@" GhcPs -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

mkHsLazyPatPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsBangPatPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkSumOrTuplePV :: SrcSpanAnnA -> Boxity -> SumOrTuple (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

rejectPragmaPV :: LocatedA (HsCmd GhcPs) -> PV ()

DisambECP (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Associated Types

type Body (HsExpr GhcPs) :: Type -> Type

type InfixOp (HsExpr GhcPs)

type FunArg (HsExpr GhcPs)

Methods

ecpFromCmd' :: LHsCmd GhcPs -> PV (LocatedA (HsExpr GhcPs))

ecpFromExp' :: LHsExpr GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsProjUpdatePV :: SrcSpan -> Located [LocatedAn NoEpAnns (DotFieldOcc GhcPs)] -> LocatedA (HsExpr GhcPs) -> Bool -> [AddEpAnn] -> PV (LHsRecProj GhcPs (LocatedA (HsExpr GhcPs)))

mkHsLamPV :: SrcSpan -> (EpAnnComments -> MatchGroup GhcPs (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsLetPV :: SrcSpan -> LHsToken "let" GhcPs -> HsLocalBinds GhcPs -> LHsToken "in" GhcPs -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

superInfixOp :: (DisambInfixOp (InfixOp (HsExpr GhcPs)) => PV (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsOpAppPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> LocatedN (InfixOp (HsExpr GhcPs)) -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

mkHsCasePV :: SrcSpan -> LHsExpr GhcPs -> LocatedL [LMatch GhcPs (LocatedA (HsExpr GhcPs))] -> EpAnnHsCase -> PV (LocatedA (HsExpr GhcPs))

mkHsLamCasePV :: SrcSpan -> LamCaseVariant -> LocatedL [LMatch GhcPs (LocatedA (HsExpr GhcPs))] -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

superFunArg :: (DisambECP (FunArg (HsExpr GhcPs)) => PV (LocatedA (HsExpr GhcPs))) -> PV (LocatedA (HsExpr GhcPs))

mkHsAppPV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LocatedA (FunArg (HsExpr GhcPs)) -> PV (LocatedA (HsExpr GhcPs))

mkHsAppTypePV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LHsToken "@" GhcPs -> LHsType GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsIfPV :: SrcSpan -> LHsExpr GhcPs -> Bool -> LocatedA (HsExpr GhcPs) -> Bool -> LocatedA (HsExpr GhcPs) -> AnnsIf -> PV (LocatedA (HsExpr GhcPs))

mkHsDoPV :: SrcSpan -> Maybe ModuleName -> LocatedL [LStmt GhcPs (LocatedA (HsExpr GhcPs))] -> AnnList -> PV (LocatedA (HsExpr GhcPs))

mkHsParPV :: SrcSpan -> LHsToken "(" GhcPs -> LocatedA (HsExpr GhcPs) -> LHsToken ")" GhcPs -> PV (LocatedA (HsExpr GhcPs))

mkHsVarPV :: LocatedN RdrName -> PV (LocatedA (HsExpr GhcPs))

mkHsLitPV :: Located (HsLit GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsOverLitPV :: LocatedAn a (HsOverLit GhcPs) -> PV (LocatedAn a (HsExpr GhcPs))

mkHsWildCardPV :: SrcSpan -> PV (Located (HsExpr GhcPs))

mkHsTySigPV :: SrcSpanAnnA -> LocatedA (HsExpr GhcPs) -> LHsType GhcPs -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsExplicitListPV :: SrcSpan -> [LocatedA (HsExpr GhcPs)] -> AnnList -> PV (LocatedA (HsExpr GhcPs))

mkHsSplicePV :: Located (HsUntypedSplice GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsRecordPV :: Bool -> SrcSpan -> SrcSpan -> LocatedA (HsExpr GhcPs) -> ([Fbind (HsExpr GhcPs)], Maybe SrcSpan) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsNegAppPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsSectionR_PV :: SrcSpan -> LocatedA (InfixOp (HsExpr GhcPs)) -> LocatedA (HsExpr GhcPs) -> PV (Located (HsExpr GhcPs))

mkHsViewPatPV :: SrcSpan -> LHsExpr GhcPs -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsAsPatPV :: SrcSpan -> LocatedN RdrName -> LHsToken "@" GhcPs -> LocatedA (HsExpr GhcPs) -> PV (LocatedA (HsExpr GhcPs))

mkHsLazyPatPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkHsBangPatPV :: SrcSpan -> LocatedA (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

mkSumOrTuplePV :: SrcSpanAnnA -> Boxity -> SumOrTuple (HsExpr GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsExpr GhcPs))

rejectPragmaPV :: LocatedA (HsExpr GhcPs) -> PV ()

DisambInfixOp (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

DisambTD (HsType GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Binary (WarningTxt GhcRn) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

put_ :: BinHandle -> WarningTxt GhcRn -> IO ()

put :: BinHandle -> WarningTxt GhcRn -> IO (Bin (WarningTxt GhcRn))

get :: BinHandle -> IO (WarningTxt GhcRn)

Binary (Warnings GhcRn) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

put_ :: BinHandle -> Warnings GhcRn -> IO ()

put :: BinHandle -> Warnings GhcRn -> IO (Bin (Warnings GhcRn))

get :: BinHandle -> IO (Warnings GhcRn)

Outputable (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.Types

Methods

ppr :: PatBuilder GhcPs -> SDoc #

OutputableBndrId a => Outputable (InstInfo (GhcPass a)) 
Instance details

Defined in GHC.Tc.Utils.Env

Methods

ppr :: InstInfo (GhcPass a) -> SDoc #

MapXRec (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

mapXRec :: Anno a ~ Anno b => (a -> b) -> XRec (GhcPass p) a -> XRec (GhcPass p) b #

UnXRec (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

unXRec :: XRec (GhcPass p) a -> a #

Binary a => Binary (WithHsDocIdentifiers a GhcRn) 
Instance details

Defined in GHC.Hs.Doc

Methods

put_ :: BinHandle -> WithHsDocIdentifiers a GhcRn -> IO ()

put :: BinHandle -> WithHsDocIdentifiers a GhcRn -> IO (Bin (WithHsDocIdentifiers a GhcRn))

get :: BinHandle -> IO (WithHsDocIdentifiers a GhcRn)

type ImportDeclPkgQual GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type ImportDeclPkgQual GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type ImportDeclPkgQual GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type XAmbiguous GhcPs 
Instance details

Defined in GHC.Hs.Type

type XAmbiguous GhcRn 
Instance details

Defined in GHC.Hs.Type

type XAmbiguous GhcTc 
Instance details

Defined in GHC.Hs.Type

type XAnyClassStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XAnyClassStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XAnyClassStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XAppTypeE GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XAppTypeE GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XAppTypeE GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeArgOne GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeArgOne GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeArgOne GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XArithSeq GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XArithSeq GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XArithSeq GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XAsPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XAsPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XAsPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XBangPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XBangPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XBangPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XCClsInstDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCClsInstDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCClsInstDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XCDefaultDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCDefaultDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCDefaultDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XCFieldOcc GhcPs 
Instance details

Defined in GHC.Hs.Type

type XCFieldOcc GhcRn 
Instance details

Defined in GHC.Hs.Type

type XCFieldOcc GhcTc 
Instance details

Defined in GHC.Hs.Type

type XCIPBind GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XCIPBind GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XCIPBind GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XCImportDecl GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcPs = XImportDeclPass
type XCImportDecl GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcRn = XImportDeclPass
type XCImportDecl GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type XCModule GhcPs 
Instance details

Defined in GHC.Hs

type XCModule GhcPs = XModulePs
type XCModule GhcRn 
Instance details

Defined in GHC.Hs

type XCModule GhcTc 
Instance details

Defined in GHC.Hs

type XCRoleAnnotDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCRoleAnnotDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCRoleAnnotDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcPs = (EpAnn [AddEpAnn], SourceText)
type XCRuleDecls GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcRn = SourceText
type XCRuleDecls GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcTc = SourceText
type XCase GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCase GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCase GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XClassDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcRn = NameSet
type XClassDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcTc = NameSet
type XCmdArrApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrForm GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrForm GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrForm GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdCase GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdCase GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdCase GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdDo GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdDo GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdDo GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdLet GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdLet GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdLet GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XCmdTop GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdTop GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdTop GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XConPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcTc = ConPatTc
type XDataDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcRn = DataDeclRn
type XDataDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcTc = DataDeclRn
type XDecBrG GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDecBrG GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDecBrG GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XDecBrL GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDecBrL GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDecBrL GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcTc = Type
type XExpBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExpBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExpBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XExplicitList GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitList GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitList GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XExplicitListTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XExplicitListTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XExplicitListTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type XExplicitSum GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitSum GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitSum GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTuple GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTuple GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTuple GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTupleTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XExplicitTupleTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XExplicitTupleTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type XExprWithTySig GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExprWithTySig GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExprWithTySig GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XForeignExport GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XForeignExport GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XForeignExport GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XForeignImport GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XForeignImport GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XForeignImport GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XGetField GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XGetField GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XGetField GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XHsOuterImplicit GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsOuterImplicit GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsOuterImplicit GhcTc 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcRn = HsPSRn
type XHsPS GhcTc 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcTc = HsPSRn
type XHsQTvs GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcRn = HsQTvsRn
type XHsQTvs GhcTc 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcTc = HsQTvsRn
type XHsRule GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcPs = (EpAnn HsRuleAnn, SourceText)
type XHsRule GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcRn = (HsRuleRn, SourceText)
type XHsRule GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcTc = (HsRuleRn, SourceText)
type XIEModuleContents GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XIEModuleContents GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XIEModuleContents GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type XIEVar GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XIEVar GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XIEVar GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type XIPBinds GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XIPBinds GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XIPBinds GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XIPVar GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XIPVar GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XIPVar GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XLazyPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XLazyPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XLazyPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XLet GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XLet GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XLet GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XListPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XListPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XListPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XMissing GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XMissing GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XMissing GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XMultiIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XMultiIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XMultiIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XNPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XNPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XNPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XNPlusKPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XNPlusKPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XNPlusKPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XNegApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XNegApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XNegApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XNewtypeStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XNewtypeStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XNewtypeStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XOpApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XOpApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XOpApp GhcRn = Fixity
type XOpApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XOverLabel GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XOverLabel GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XOverLabel GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XOverLit GhcPs 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcRn 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcRn = OverLitRn
type XOverLit GhcTc 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcTc = OverLitTc
type XPatBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XPatBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XPatBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XProjection GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XProjection GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XProjection GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XRecSel GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecSel GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecSel GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XRecTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XRecTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XRecTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type XRecordCon GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecordCon GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecordCon GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XRecordUpd GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecordUpd GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecordUpd GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XSectionL GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XSectionL GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XSectionL GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XSectionR GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XSectionR GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XSectionR GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XSigPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSigPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSigPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XSplicePat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSplicePat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSplicePat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XSpliceTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XSpliceTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XSpliceTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type XStandaloneKindSig GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XStandaloneKindSig GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XStandaloneKindSig GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XStatic GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcRn = NameSet
type XStatic GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcTc = (NameSet, Type)
type XStockStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XStockStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XStockStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XSumPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcPs = EpAnn EpAnnSumPat
type XSumPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcTc = [Type]
type XSynDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcRn = NameSet
type XSynDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcTc = NameSet
type XTuplePat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XTuplePat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XTuplePat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XTyFamInstD GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XTyFamInstD GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XTyFamInstD GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XTypBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XTypedBracket GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypedBracket GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypedBracket GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XTypedSplice GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypedSplice GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypedSplice GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XUnambiguous GhcPs 
Instance details

Defined in GHC.Hs.Type

type XUnambiguous GhcRn 
Instance details

Defined in GHC.Hs.Type

type XUnambiguous GhcTc 
Instance details

Defined in GHC.Hs.Type

type XUnboundVar GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUnboundVar GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUnboundVar GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XUntypedBracket GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedBracket GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedBracket GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSplice GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSplice GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSplice GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSpliceExpr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSpliceExpr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSpliceExpr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XVarBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XVarBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XVarBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XViaStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcPs = XViaStrategyPs
type XViaStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XViewPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XViewPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XViewPat GhcRn = Maybe (HsExpr GhcRn)
type XViewPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XWarnings GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcPs = (EpAnn [AddEpAnn], SourceText)
type XWarnings GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcRn = SourceText
type XWarnings GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcTc = SourceText
type XWildPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XWildPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XWildPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XXCmd GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXCmd GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXCmd GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XXExpr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXExpr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXExpr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XXPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcRn = HsPatExpansion (Pat GhcRn) (Pat GhcRn)
type XXPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcTc = XXPatGhcTc
type XXQuote GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXQuote GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXQuote GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XXSig GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XXSig GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XXSig GhcTc 
Instance details

Defined in GHC.Hs.Binds

type ConLikeP GhcPs 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcPs = RdrName
type ConLikeP GhcRn 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcTc 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcTc = ConLike
type XHsOuterExplicit GhcPs _1 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcPs _1 = EpAnnForallTy
type XHsOuterExplicit GhcRn _1 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcTc flag 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcTc flag = [VarBndr TyVar flag]
type XHsWC GhcPs b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcRn b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcRn b = [Name]
type XHsWC GhcTc b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcTc b = [Name]
type XMG GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcPs b = Origin
type XMG GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcRn b = Origin
type XMG GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XXHsBindsLR GhcPs pR 
Instance details

Defined in GHC.Hs.Binds

type XXHsBindsLR GhcRn pR 
Instance details

Defined in GHC.Hs.Binds

type XXHsBindsLR GhcTc pR 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcPs (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcRn (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcRn (GhcPass pR) = NameSet
type XPatBind GhcTc (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcTc (GhcPass pR) = (Type, ([CoreTickish], [[CoreTickish]]))
type Body (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (PatBuilder GhcPs) = PatBuilder
type Body (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (HsCmd GhcPs) = HsCmd
type Body (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (HsExpr GhcPs) = HsExpr
type FunArg (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type FunArg (PatBuilder GhcPs) = PatBuilder GhcPs
type FunArg (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type FunArg (HsCmd GhcPs) = HsExpr GhcPs
type FunArg (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type FunArg (HsExpr GhcPs) = HsExpr GhcPs
type InfixOp (PatBuilder GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type InfixOp (PatBuilder GhcPs) = RdrName
type InfixOp (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type InfixOp (HsCmd GhcPs) = HsExpr GhcPs
type InfixOp (HsExpr GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type InfixOp (HsExpr GhcPs) = HsExpr GhcPs
type SyntaxExpr (GhcPass p) 
Instance details

Defined in GHC.Hs.Expr

type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (FixitySig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (IPBind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (Sig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (AnnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ClsInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ConDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DataFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DefaultDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivClauseTys (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivStrategy (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DocDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamilyDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamilyResultSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ForeignDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FunDep (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (HsDecl (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (HsDerivingClause (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (InjectivityAnn (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (InstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RoleAnnotDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleBndr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (SpliceDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (StandaloneKindSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (TyClDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (TyFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (WarnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (WarnDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DotFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (FieldLabelStrings (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsCmd (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsCmdTop (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsExpr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsUntypedSplice (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (IE (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (IE (GhcPass p)) = SrcSpanAnnA
type Anno (IEWrappedName (GhcPass _1)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (ImportDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (HsOverLit (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

type Anno (Pat (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

type Anno (AmbiguousFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (BangType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (ConDeclField (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (FieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsKind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsSigType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type IdP (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

type IdP (GhcPass p) = IdGhcP p
type NoGhcTc (GhcPass pass) 
Instance details

Defined in GHC.Hs.Extension

type NoGhcTc (GhcPass pass) = GhcPass (NoGhcTcPass pass)
type XAnnD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XApp (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XApp (GhcPass _1) = EpAnnCO
type XAppKindTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XAppTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XApplicativeArgMany (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XBangTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XCDerivDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCDotFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCExport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCExport (GhcPass _1) = Located SourceText
type XCFamilyDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCFunDep (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCHsDataDefn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCHsDerivingClause (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCHsGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCImport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCImport (GhcPass _1) = Located SourceText
type XCInjectivityAnn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCKindSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCRuleBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCTyClGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCTyFamInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCharTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XCharTy (GhcPass _1) = SourceText
type XClassOpSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XClsInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCmdApp (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdApp (GhcPass _1) = EpAnnCO
type XCmdLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdLamCase (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdPar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdPar (GhcPass _1) = EpAnnCO
type XCmdWrap (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCompleteMatchSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XCompleteMatchSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
type XConDeclField (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XConDeclGADT (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XConDeclH98 (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDataFamInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDctMulti (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDctSingle (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDefD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDerivD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDocD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XDocTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XFamDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XFixSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XFixitySig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XForAllTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XForD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XFunTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XFunTy (GhcPass _1) = EpAnnCO
type XHsAnnotation (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XHsAnnotation (GhcPass _1) = (EpAnn AnnPragma, SourceText)
type XHsChar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsChar (GhcPass _1) = SourceText
type XHsCharPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsCharPrim (GhcPass _1) = SourceText
type XHsDoublePrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsFloatPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsForAllInvis (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XHsForAllInvis (GhcPass _1) = EpAnnForallTy
type XHsForAllVis (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XHsForAllVis (GhcPass _1) = EpAnnForallTy
type XHsInt (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsInt64Prim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsInt64Prim (GhcPass _1) = SourceText
type XHsIntPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsIntPrim (GhcPass _1) = SourceText
type XHsInteger (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsInteger (GhcPass _1) = SourceText
type XHsRat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XHsString (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsString (GhcPass _1) = SourceText
type XHsStringPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsStringPrim (GhcPass _1) = SourceText
type XHsWord64Prim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsWord64Prim (GhcPass _1) = SourceText
type XHsWordPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsWordPrim (GhcPass _1) = SourceText
type XIEDoc (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEDocNamed (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEName (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEPattern (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingAbs (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingAll (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingWith (GhcPass 'Parsed) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingWith (GhcPass 'Renamed) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingWith (GhcPass 'Renamed) = [Located FieldLabel]
type XIEThingWith (GhcPass 'Typechecked) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEType (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XIParamTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XInlineSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XKindSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XKindSigD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XKindedTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLam (GhcPass _1) = NoExtField
type XLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLam (GhcPass _1) = NoExtField
type XLamCase (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XListTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XLitE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLitE (GhcPass _1) = EpAnnCO
type XLitPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type XMinimalSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XMinimalSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
type XNoSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XNumTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XNumTy (GhcPass _1) = SourceText
type XOpTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XOpTy (GhcPass _1) = EpAnn [AddEpAnn]
type XOverLitE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XPar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XPar (GhcPass _1) = EpAnnCO
type XParPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type XParPat (GhcPass _1) = EpAnnCO
type XParTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XPatSynSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XPragE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XPresent (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XProc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XProc (GhcPass _1) = EpAnn [AddEpAnn]
type XQualTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XRoleAnnotD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XRuleBndrSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XRuleD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XSCC (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XSCC (GhcPass _1) = (EpAnn AnnPragma, SourceText)
type XSCCFunSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XSCCFunSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
type XSigD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XSpecInstSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XSpecInstSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)
type XSpecSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XSpliceD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XSpliceDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XStarTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XStrTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XStrTy (GhcPass _1) = SourceText
type XSumTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XTupleTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XTyClD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XTyLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XTyVarSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XTypeSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XUserTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XValD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XVar (GhcPass _1) = NoExtField
type XVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XVar (GhcPass _1) = NoExtField
type XVarPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type XWarning (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XWarningD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XWildCardTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXAmbiguousFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXAnnDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXApplicativeArg (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XXClsInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXCmdTop (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XXConDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXConDeclField (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXDefaultDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXDerivClauseTys (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXDerivDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXDotFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XXFamilyDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXFamilyResultSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXFixitySig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XXForeignDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXForeignExport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXForeignImport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXFunDep (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXHsDataDefn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXHsDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXHsDerivingClause (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXHsForAllTelescope (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXHsGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXHsIPBinds (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XXHsOuterTyVarBndrs (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXHsPatSigType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXHsSigType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXIE (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XXIEWrappedName (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XXIPBind (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XXImportDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type XXInjectivityAnn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXLHsQTyVars (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XXOverLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XXPragE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XXRoleAnnotDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXRuleBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXRuleDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXRuleDecls (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXSpliceDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXStandaloneKindSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Decls

type XXTupArg (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XXTyClDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXTyClGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXTyFamInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXTyLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXTyVarBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXType (GhcPass _1) = HsCoreTy
type XXWarnDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XXWarnDecls (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCFamEqn (GhcPass _1) r 
Instance details

Defined in GHC.Hs.Decls

type XCFamEqn (GhcPass _1) r = EpAnn [AddEpAnn]
type XCGRHS (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type XCGRHS (GhcPass _1) _2 = EpAnn GrhsAnn
type XCGRHSs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type XCMatch (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type XCMatch (GhcPass _1) b = EpAnn [AddEpAnn]
type XFunBind (GhcPass pL) GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcRn = NameSet
type XFunBind (GhcPass pL) GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcTc = (HsWrapper, [CoreTickish])
type XPSB (GhcPass idL) GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcRn = NameSet
type XPSB (GhcPass idL) GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcTc = NameSet
type XRec (GhcPass p) a 
Instance details

Defined in GHC.Hs.Extension

type XRec (GhcPass p) a = GenLocated (Anno a) a
type XXFamEqn (GhcPass _1) r 
Instance details

Defined in GHC.Hs.Decls

type XXGRHS (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type XXGRHSs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type XXHsWildCardBndrs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Type

type XXMatch (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type XXMatchGroup (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type XXValBindsLR (GhcPass pL) pR 
Instance details

Defined in GHC.Hs.Binds

type XApplicativeStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XBindStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XBindStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XBindStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcTc b = Type
type XParStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcTc b = Type
type XRecStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XRecStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XRecStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XTransStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XTransStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XTransStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XEmptyLocalBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XHsIPBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XHsValBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XParStmtBlock (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Expr

type XPatSynBind (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XValBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XVarBind (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XXHsLocalBindsLR (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XXParStmtBlock (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Expr

type XXPatSynBind (GhcPass idL) (GhcPass idR) 
Instance details

Defined in GHC.Hs.Binds

type XLastStmt (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type XLastStmt (GhcPass _1) (GhcPass _2) b = NoExtField
type XLetStmt (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type XLetStmt (GhcPass _1) (GhcPass _2) b = EpAnn [AddEpAnn]
type XXStmtLR (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) = SrcSpanAnnA
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (HsOuterTyVarBndrs _1 (GhcPass _2)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag (GhcPass _1)) = SrcSpanAnnA
type Anno (HsTyVarBndr _flag GhcPs) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcRn) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcTc) 
Instance details

Defined in GHC.Hs.Type

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data IfGblEnv #

Constructors

IfGblEnv 

Fields

newtype UnitId #

Constructors

UnitId 

Fields

Instances

Instances details
Data Unit 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unit -> c Unit

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Unit

toConstr :: Unit -> Constr

dataTypeOf :: Unit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Unit)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Unit)

gmapT :: (forall b. Data b => b -> b) -> Unit -> Unit

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r

gmapQ :: (forall d. Data d => d -> u) -> Unit -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unit -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unit -> m Unit

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit

Data UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnitId -> c UnitId

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnitId

toConstr :: UnitId -> Constr

dataTypeOf :: UnitId -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnitId)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnitId)

gmapT :: (forall b. Data b => b -> b) -> UnitId -> UnitId

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r

gmapQ :: (forall d. Data d => d -> u) -> UnitId -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnitId -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId

Show Unit 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> Unit -> ShowS

show :: Unit -> String

showList :: [Unit] -> ShowS

NFData Unit 
Instance details

Defined in GHC.Unit.Types

Methods

rnf :: Unit -> ()

Uniquable Module 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Module -> Unique #

Uniquable UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: UnitId -> Unique #

IsUnitId UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: UnitId -> FastString #

Binary InstantiatedUnit 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> InstantiatedUnit -> IO ()

put :: BinHandle -> InstantiatedUnit -> IO (Bin InstantiatedUnit)

get :: BinHandle -> IO InstantiatedUnit

Binary Unit 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> Unit -> IO ()

put :: BinHandle -> Unit -> IO (Bin Unit)

get :: BinHandle -> IO Unit

Binary UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> UnitId -> IO ()

put :: BinHandle -> UnitId -> IO (Bin UnitId)

get :: BinHandle -> IO UnitId

Outputable InstalledModule 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstalledModule -> SDoc #

Outputable InstantiatedModule 
Instance details

Defined in GHC.Unit.Types

Outputable InstantiatedUnit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstantiatedUnit -> SDoc #

Outputable Module 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Module -> SDoc #

Outputable Unit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Unit -> SDoc #

Outputable UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: UnitId -> SDoc #

Eq UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: UnitId -> UnitId -> Bool

(/=) :: UnitId -> UnitId -> Bool

Ord Unit 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: Unit -> Unit -> Ordering

(<) :: Unit -> Unit -> Bool

(<=) :: Unit -> Unit -> Bool

(>) :: Unit -> Unit -> Bool

(>=) :: Unit -> Unit -> Bool

max :: Unit -> Unit -> Unit

min :: Unit -> Unit -> Unit

Ord UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: UnitId -> UnitId -> Ordering

(<) :: UnitId -> UnitId -> Bool

(<=) :: UnitId -> UnitId -> Bool

(>) :: UnitId -> UnitId -> Bool

(>=) :: UnitId -> UnitId -> Bool

max :: UnitId -> UnitId -> UnitId

min :: UnitId -> UnitId -> UnitId

data IE pass #

Constructors

IEVar (XIEVar pass) (LIEWrappedName pass) 
IEThingAbs (XIEThingAbs pass) (LIEWrappedName pass) 
IEThingAll (XIEThingAll pass) (LIEWrappedName pass) 
IEThingWith (XIEThingWith pass) (LIEWrappedName pass) IEWildcard [LIEWrappedName pass] 
IEModuleContents (XIEModuleContents pass) (XRec pass ModuleName) 
IEGroup (XIEGroup pass) Int (LHsDoc pass) 
IEDoc (XIEDoc pass) (LHsDoc pass) 
IEDocNamed (XIEDocNamed pass) String 
XIE !(XXIE pass) 

Instances

Instances details
type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (IE (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (IE (GhcPass p)) = SrcSpanAnnA
type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

data EpAnn ann #

Constructors

EpAnn 

Fields

EpAnnNotUsed 

Instances

Instances details
Functor EpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

fmap :: (a -> b) -> EpAnn a -> EpAnn b

(<$) :: a -> EpAnn b -> EpAnn a

Data ann => Data (EpAnn ann) 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnn ann -> c (EpAnn ann)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EpAnn ann)

toConstr :: EpAnn ann -> Constr

dataTypeOf :: EpAnn ann -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EpAnn ann))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EpAnn ann))

gmapT :: (forall b. Data b => b -> b) -> EpAnn ann -> EpAnn ann

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnn ann -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnn ann -> r

gmapQ :: (forall d. Data d => d -> u) -> EpAnn ann -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnn ann -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann)

Monoid a => Monoid (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: EpAnn a

mappend :: EpAnn a -> EpAnn a -> EpAnn a

mconcat :: [EpAnn a] -> EpAnn a

Semigroup a => Semigroup (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: EpAnn a -> EpAnn a -> EpAnn a

sconcat :: NonEmpty (EpAnn a) -> EpAnn a

stimes :: Integral b => b -> EpAnn a -> EpAnn a

Outputable a => Outputable (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpAnn a -> SDoc #

Eq ann => Eq (EpAnn ann) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpAnn ann -> EpAnn ann -> Bool

(/=) :: EpAnn ann -> EpAnn ann -> Bool

NamedThing (Located a) => NamedThing (LocatedAn an a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

getOccName :: LocatedAn an a -> OccName #

getName :: LocatedAn an a -> Name #

type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) = SrcSpan
type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] = SrcSpan
type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data SrcSpanAnn' a #

Constructors

SrcSpanAnn 

Fields

Instances

Instances details
Data a => Data (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpanAnn' a -> c (SrcSpanAnn' a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SrcSpanAnn' a)

toConstr :: SrcSpanAnn' a -> Constr

dataTypeOf :: SrcSpanAnn' a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SrcSpanAnn' a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SrcSpanAnn' a))

gmapT :: (forall b. Data b => b -> b) -> SrcSpanAnn' a -> SrcSpanAnn' a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanAnn' a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanAnn' a -> r

gmapQ :: (forall d. Data d => d -> u) -> SrcSpanAnn' a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpanAnn' a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a)

Semigroup an => Semigroup (SrcSpanAnn' an) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: SrcSpanAnn' an -> SrcSpanAnn' an -> SrcSpanAnn' an

sconcat :: NonEmpty (SrcSpanAnn' an) -> SrcSpanAnn' an

stimes :: Integral b => b -> SrcSpanAnn' an -> SrcSpanAnn' an

Outputable a => Outputable (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: SrcSpanAnn' a -> SDoc #

Eq a => Eq (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: SrcSpanAnn' a -> SrcSpanAnn' a -> Bool

(/=) :: SrcSpanAnn' a -> SrcSpanAnn' a -> Bool

NamedThing (Located a) => NamedThing (LocatedAn an a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

getOccName :: LocatedAn an a -> OccName #

getName :: LocatedAn an a -> Name #

(Outputable a, Outputable e) => Outputable (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: GenLocated (SrcSpanAnn' a) e -> SDoc #

(Outputable a, OutputableBndr e) => OutputableBndr (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) = SrcSpan
type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] = SrcSpan
type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data TokenLocation #

Instances

Instances details
Data TokenLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TokenLocation -> c TokenLocation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TokenLocation

toConstr :: TokenLocation -> Constr

dataTypeOf :: TokenLocation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TokenLocation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TokenLocation)

gmapT :: (forall b. Data b => b -> b) -> TokenLocation -> TokenLocation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TokenLocation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TokenLocation -> r

gmapQ :: (forall d. Data d => d -> u) -> TokenLocation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TokenLocation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation

Eq TokenLocation 
Instance details

Defined in GHC.Parser.Annotation

Outputable a => Outputable (GenLocated TokenLocation a) 
Instance details

Defined in GHC.Parser.Annotation

class Outputable a => OutputableBndr a where #

Minimal complete definition

pprPrefixOcc, pprInfixOcc

Methods

pprBndr :: BindingSite -> a -> SDoc #

pprPrefixOcc :: a -> SDoc #

pprInfixOcc :: a -> SDoc #

bndrIsJoin_maybe :: a -> Maybe Int #

Instances

Instances details
OutputableBndr ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

pprBndr :: BindingSite -> ConLike -> SDoc #

pprPrefixOcc :: ConLike -> SDoc #

pprInfixOcc :: ConLike -> SDoc #

bndrIsJoin_maybe :: ConLike -> Maybe Int #

OutputableBndr DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

pprBndr :: BindingSite -> DataCon -> SDoc #

pprPrefixOcc :: DataCon -> SDoc #

pprInfixOcc :: DataCon -> SDoc #

bndrIsJoin_maybe :: DataCon -> Maybe Int #

OutputableBndr PatSyn 
Instance details

Defined in GHC.Core.PatSyn

Methods

pprBndr :: BindingSite -> PatSyn -> SDoc #

pprPrefixOcc :: PatSyn -> SDoc #

pprInfixOcc :: PatSyn -> SDoc #

bndrIsJoin_maybe :: PatSyn -> Maybe Int #

OutputableBndr BinderInfo 
Instance details

Defined in GHC.Stg.Lift.Analysis

Methods

pprBndr :: BindingSite -> BinderInfo -> SDoc #

pprPrefixOcc :: BinderInfo -> SDoc #

pprInfixOcc :: BinderInfo -> SDoc #

bndrIsJoin_maybe :: BinderInfo -> Maybe Int #

OutputableBndr Name 
Instance details

Defined in GHC.Types.Name

OutputableBndr OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

OutputableBndr RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

pprBndr :: BindingSite -> RdrName -> SDoc #

pprPrefixOcc :: RdrName -> SDoc #

pprInfixOcc :: RdrName -> SDoc #

bndrIsJoin_maybe :: RdrName -> Maybe Int #

(Outputable a, OutputableBndr e) => OutputableBndr (GenLocated (SrcSpanAnn' a) e) 
Instance details

Defined in GHC.Parser.Annotation

OutputableBndr (Id, TagSig) 
Instance details

Defined in GHC.Stg.InferTags.TagSig

Methods

pprBndr :: BindingSite -> (Id, TagSig) -> SDoc #

pprPrefixOcc :: (Id, TagSig) -> SDoc #

pprInfixOcc :: (Id, TagSig) -> SDoc #

bndrIsJoin_maybe :: (Id, TagSig) -> Maybe Int #

data SDoc #

Instances

Instances details
IsString SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

fromString :: String -> SDoc

IsDoc SDoc 
Instance details

Defined in GHC.Utils.Outputable

Associated Types

type Line SDoc = (r :: Type) #

Methods

line :: Line SDoc -> SDoc #

($$) :: SDoc -> SDoc -> SDoc #

lines_ :: [Line SDoc] -> SDoc #

vcat :: [SDoc] -> SDoc #

dualDoc :: SDoc -> HDoc -> SDoc #

IsLine SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

char :: Char -> SDoc #

text :: String -> SDoc #

ftext :: FastString -> SDoc #

ztext :: FastZString -> SDoc #

(<>) :: SDoc -> SDoc -> SDoc #

(<+>) :: SDoc -> SDoc -> SDoc #

sep :: [SDoc] -> SDoc #

fsep :: [SDoc] -> SDoc #

hcat :: [SDoc] -> SDoc #

hsep :: [SDoc] -> SDoc #

dualLine :: SDoc -> HLine -> SDoc #

IsOutput SDoc 
Instance details

Defined in GHC.Utils.Outputable

Outputable SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: SDoc -> SDoc #

OutputableP env SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> SDoc -> SDoc #

type Line SDoc 
Instance details

Defined in GHC.Utils.Outputable

type Line SDoc = SDoc

data HsToken (tok :: Symbol) #

Constructors

HsTok 

Instances

Instances details
KnownSymbol tok => Data (HsToken tok) 
Instance details

Defined in Language.Haskell.Syntax.Concrete

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsToken tok -> c (HsToken tok)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsToken tok)

toConstr :: HsToken tok -> Constr

dataTypeOf :: HsToken tok -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsToken tok))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsToken tok))

gmapT :: (forall b. Data b => b -> b) -> HsToken tok -> HsToken tok

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsToken tok -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsToken tok -> r

gmapQ :: (forall d. Data d => d -> u) -> HsToken tok -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsToken tok -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsToken tok -> m (HsToken tok)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsToken tok -> m (HsToken tok)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsToken tok -> m (HsToken tok)

type Anno (HsToken tok) 
Instance details

Defined in GHC.Hs.Extension

data HsUniToken (tok :: Symbol) (utok :: Symbol) #

Constructors

HsNormalTok 
HsUnicodeTok 

Instances

Instances details
(KnownSymbol tok, KnownSymbol utok) => Data (HsUniToken tok utok) 
Instance details

Defined in Language.Haskell.Syntax.Concrete

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsUniToken tok utok -> c (HsUniToken tok utok)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsUniToken tok utok)

toConstr :: HsUniToken tok utok -> Constr

dataTypeOf :: HsUniToken tok utok -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsUniToken tok utok))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsUniToken tok utok))

gmapT :: (forall b. Data b => b -> b) -> HsUniToken tok utok -> HsUniToken tok utok

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsUniToken tok utok -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsUniToken tok utok -> r

gmapQ :: (forall d. Data d => d -> u) -> HsUniToken tok utok -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsUniToken tok utok -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsUniToken tok utok -> m (HsUniToken tok utok)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsUniToken tok utok -> m (HsUniToken tok utok)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsUniToken tok utok -> m (HsUniToken tok utok)

type Anno (HsUniToken tok utok) 
Instance details

Defined in GHC.Hs.Extension

type Anno (HsUniToken tok utok) = TokenLocation

data LayoutInfo pass #

Constructors

ExplicitBraces !(LHsToken "{" pass) !(LHsToken "}" pass) 
VirtualBraces !Int 
NoLayoutInfo 

Instances

Instances details
Typeable p => Data (LayoutInfo (GhcPass p)) 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LayoutInfo (GhcPass p) -> c (LayoutInfo (GhcPass p))

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LayoutInfo (GhcPass p))

toConstr :: LayoutInfo (GhcPass p) -> Constr

dataTypeOf :: LayoutInfo (GhcPass p) -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (LayoutInfo (GhcPass p)))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LayoutInfo (GhcPass p)))

gmapT :: (forall b. Data b => b -> b) -> LayoutInfo (GhcPass p) -> LayoutInfo (GhcPass p)

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r

gmapQ :: (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p))

type family Anno a = (b :: Type) #

Instances

Instances details
type Anno ConLike 
Instance details

Defined in GHC.Hs.Pat

type Anno ConLike = SrcSpanAnnN
type Anno FastString 
Instance details

Defined in GHC.Hs.Expr

type Anno OverlapMode 
Instance details

Defined in GHC.Hs.Decls

type Anno OverlapMode 
Instance details

Defined in GHC.Hs.Decls

type Anno CCallConv 
Instance details

Defined in GHC.Hs.Decls

type Anno CCallConv = SrcSpan
type Anno CExportSpec 
Instance details

Defined in GHC.Hs.Decls

type Anno CExportSpec = SrcSpan
type Anno CType 
Instance details

Defined in GHC.Hs.Decls

type Anno CType = SrcSpanAnnP
type Anno Safety 
Instance details

Defined in GHC.Hs.Decls

type Anno Safety = SrcSpan
type Anno Name 
Instance details

Defined in GHC.Hs.Extension

type Anno RdrName 
Instance details

Defined in GHC.Hs.Extension

type Anno RdrName = SrcSpanAnnN
type Anno StringLiteral 
Instance details

Defined in GHC.Hs.Binds

type Anno StringLiteral = SrcAnn NoEpAnns
type Anno Id 
Instance details

Defined in GHC.Hs.Extension

type Anno FieldLabelString 
Instance details

Defined in GHC.Hs.Expr

type Anno FieldLabelString = SrcSpanAnnN
type Anno ModuleName 
Instance details

Defined in GHC.Hs

type Anno ModuleName 
Instance details

Defined in GHC.Hs.ImpExp

type Anno RecFieldsDotDot 
Instance details

Defined in GHC.Hs.Pat

type Anno HsIPName 
Instance details

Defined in GHC.Hs.Type

type Anno Bool 
Instance details

Defined in GHC.Hs.Decls

type Anno Bool = SrcAnn NoEpAnns
type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) = SrcSpan
type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno (FixitySig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (IPBind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (Sig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (HsToken tok) 
Instance details

Defined in GHC.Hs.Extension

type Anno (AnnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ClsInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ConDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DataFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DefaultDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivClauseTys (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DerivStrategy (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DocDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamilyDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamilyResultSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (ForeignDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FunDep (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (HsDecl (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (HsDerivingClause (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (InjectivityAnn (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (InstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RoleAnnotDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleBndr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (RuleDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (SpliceDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (StandaloneKindSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (TyClDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (TyFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (WarnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (WarnDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type Anno (DotFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (FieldLabelStrings (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsCmd (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsCmdTop (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsExpr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (HsUntypedSplice (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno (IE (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (IE (GhcPass p)) = SrcSpanAnnA
type Anno (IEWrappedName (GhcPass _1)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (ImportDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno (HsOverLit (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

type Anno (Pat (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

type Anno (AmbiguousFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (BangType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (ConDeclField (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (FieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsKind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsSigType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns
type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns
type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] = SrcSpan
type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) = SrcSpanAnnA
type Anno (HsUniToken tok utok) 
Instance details

Defined in GHC.Hs.Extension

type Anno (HsUniToken tok utok) = TokenLocation
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (HsFieldBind lhs rhs) 
Instance details

Defined in GHC.Hs.Pat

type Anno (HsFieldBind lhs rhs) = SrcSpanAnnA
type Anno (HsOuterTyVarBndrs _1 (GhcPass _2)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag (GhcPass _1)) = SrcSpanAnnA
type Anno (HsTyVarBndr _flag GhcPs) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcRn) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcTc) 
Instance details

Defined in GHC.Hs.Type

type Anno (SourceText, RuleName) 
Instance details

Defined in GHC.Hs.Decls

type Anno (SourceText, RuleName) = SrcAnn NoEpAnns
type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data DataConCantHappen #

Instances

Instances details
Data DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataConCantHappen -> c DataConCantHappen

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataConCantHappen

toConstr :: DataConCantHappen -> Constr

dataTypeOf :: DataConCantHappen -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataConCantHappen)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataConCantHappen)

gmapT :: (forall b. Data b => b -> b) -> DataConCantHappen -> DataConCantHappen

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataConCantHappen -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataConCantHappen -> r

gmapQ :: (forall d. Data d => d -> u) -> DataConCantHappen -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataConCantHappen -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen

Eq DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Ord DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

type family IdP p #

Instances

Instances details
type IdP (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

type IdP (GhcPass p) = IdGhcP p

class MapXRec p where #

Methods

mapXRec :: Anno a ~ Anno b => (a -> b) -> XRec p a -> XRec p b #

Instances

Instances details
MapXRec (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

mapXRec :: Anno a ~ Anno b => (a -> b) -> XRec (GhcPass p) a -> XRec (GhcPass p) b #

data NoExtField #

Constructors

NoExtField 

Instances

Instances details
Data NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoExtField -> c NoExtField

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoExtField

toConstr :: NoExtField -> Constr

dataTypeOf :: NoExtField -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoExtField)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoExtField)

gmapT :: (forall b. Data b => b -> b) -> NoExtField -> NoExtField

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r

gmapQ :: (forall d. Data d => d -> u) -> NoExtField -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoExtField -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField

Eq NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

(==) :: NoExtField -> NoExtField -> Bool

(/=) :: NoExtField -> NoExtField -> Bool

Ord NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

type family NoGhcTc p #

Instances

Instances details
type NoGhcTc (GhcPass pass) 
Instance details

Defined in GHC.Hs.Extension

type NoGhcTc (GhcPass pass) = GhcPass (NoGhcTcPass pass)

class UnXRec p where #

Methods

unXRec :: XRec p a -> a #

Instances

Instances details
UnXRec (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

unXRec :: XRec (GhcPass p) a -> a #

type family XRec p a = (r :: Type) | r -> a #

Instances

Instances details
type XRec (GhcPass p) a 
Instance details

Defined in GHC.Hs.Extension

type XRec (GhcPass p) a = GenLocated (Anno a) a

data Pass #

Constructors

Parsed 
Renamed 
Typechecked 

Instances

Instances details
Data Pass 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pass -> c Pass

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pass

toConstr :: Pass -> Constr

dataTypeOf :: Pass -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pass)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pass)

gmapT :: (forall b. Data b => b -> b) -> Pass -> Pass

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pass -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pass -> r

gmapQ :: (forall d. Data d => d -> u) -> Pass -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pass -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pass -> m Pass

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pass -> m Pass

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pass -> m Pass

class (NoGhcTcPass (NoGhcTcPass p) ~ NoGhcTcPass p, IsPass (NoGhcTcPass p)) => IsPass (p :: Pass) where #

Methods

ghcPass :: GhcPass p #

Instances

Instances details
IsPass 'Parsed 
Instance details

Defined in GHC.Hs.Extension

Methods

ghcPass :: GhcPass 'Parsed #

IsPass 'Renamed 
Instance details

Defined in GHC.Hs.Extension

IsPass 'Typechecked 
Instance details

Defined in GHC.Hs.Extension

type family IdGhcP (pass :: Pass) where ... #

Equations

IdGhcP 'Parsed = RdrName 
IdGhcP 'Renamed = Name 
IdGhcP 'Typechecked = Id 

type IsSrcSpanAnn (p :: Pass) a = (Anno (IdGhcP p) ~ SrcSpanAnn' (EpAnn a), IsPass p) #

type family NoGhcTcPass (p :: Pass) :: Pass where ... #

Equations

NoGhcTcPass 'Typechecked = 'Renamed 
NoGhcTcPass other = other 

data Var #

Instances

Instances details
Data Var 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Var -> c Var

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Var

toConstr :: Var -> Constr

dataTypeOf :: Var -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Var)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Var)

gmapT :: (forall b. Data b => b -> b) -> Var -> Var

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Var -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Var -> r

gmapQ :: (forall d. Data d => d -> u) -> Var -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Var -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Var -> m Var

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Var -> m Var

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Var -> m Var

NamedThing Var 
Instance details

Defined in GHC.Types.Var

Methods

getOccName :: Var -> OccName #

getName :: Var -> Name #

HasOccName Var 
Instance details

Defined in GHC.Types.Var

Methods

occName :: Var -> OccName #

Uniquable Var 
Instance details

Defined in GHC.Types.Var

Methods

getUnique :: Var -> Unique #

Outputable Var 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: Var -> SDoc #

Eq Var 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: Var -> Var -> Bool

(/=) :: Var -> Var -> Bool

Ord Var 
Instance details

Defined in GHC.Types.Var

Methods

compare :: Var -> Var -> Ordering

(<) :: Var -> Var -> Bool

(<=) :: Var -> Var -> Bool

(>) :: Var -> Var -> Bool

(>=) :: Var -> Var -> Bool

max :: Var -> Var -> Var

min :: Var -> Var -> Var

Eq (DeBruijn Var) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Var -> DeBruijn Var -> Bool

(/=) :: DeBruijn Var -> DeBruijn Var -> Bool

OutputableBndr (Id, TagSig) 
Instance details

Defined in GHC.Stg.InferTags.TagSig

Methods

pprBndr :: BindingSite -> (Id, TagSig) -> SDoc #

pprPrefixOcc :: (Id, TagSig) -> SDoc #

pprInfixOcc :: (Id, TagSig) -> SDoc #

bndrIsJoin_maybe :: (Id, TagSig) -> Maybe Int #

type Anno Id 
Instance details

Defined in GHC.Hs.Extension

type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

data HsSrcBang #

Constructors

HsSrcBang SourceText SrcUnpackedness SrcStrictness 

Instances

Instances details
Data HsSrcBang 
Instance details

Defined in GHC.Core.DataCon

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsSrcBang -> c HsSrcBang

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsSrcBang

toConstr :: HsSrcBang -> Constr

dataTypeOf :: HsSrcBang -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsSrcBang)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsSrcBang)

gmapT :: (forall b. Data b => b -> b) -> HsSrcBang -> HsSrcBang

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsSrcBang -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsSrcBang -> r

gmapQ :: (forall d. Data d => d -> u) -> HsSrcBang -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsSrcBang -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsSrcBang -> m HsSrcBang

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsSrcBang -> m HsSrcBang

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsSrcBang -> m HsSrcBang

Outputable HsSrcBang 
Instance details

Defined in GHC.Core.DataCon

Methods

ppr :: HsSrcBang -> SDoc #

data FixitySig pass #

Constructors

FixitySig (XFixitySig pass) [LIdP pass] Fixity 
XFixitySig !(XXFixitySig pass) 

Instances

Instances details
type Anno (FixitySig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type HsBind id = HsBindLR id id #

data HsBindLR idL idR #

Constructors

FunBind 

Fields

PatBind 

Fields

VarBind 

Fields

PatSynBind (XPatSynBind idL idR) (PatSynBind idL idR) 
XHsBindsLR !(XXHsBindsLR idL idR) 

Instances

Instances details
type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) 
Instance details

Defined in GHC.Hs.Binds

type Anno (HsBindLR (GhcPass idL) (GhcPass idR)) = SrcSpanAnnA

data HsIPBinds id #

Constructors

IPBinds (XIPBinds id) [LIPBind id] 
XHsIPBinds !(XXHsIPBinds id) 

type HsLocalBinds id = HsLocalBindsLR id id #

data HsLocalBindsLR idL idR #

Constructors

HsValBinds (XHsValBinds idL idR) (HsValBindsLR idL idR) 
HsIPBinds (XHsIPBinds idL idR) (HsIPBinds idR) 
EmptyLocalBinds (XEmptyLocalBinds idL idR) 
XHsLocalBindsLR !(XXHsLocalBindsLR idL idR) 

type HsPatSynDetails pass = HsConDetails Void (LIdP pass) [RecordPatSynField pass] #

type HsValBinds id = HsValBindsLR id id #

data HsValBindsLR idL idR #

Constructors

ValBinds (XValBinds idL idR) (LHsBindsLR idL idR) [LSig idR] 
XValBindsLR !(XXValBindsLR idL idR) 

data IPBind id #

Constructors

IPBind (XCIPBind id) (XRec id HsIPName) (LHsExpr id) 
XIPBind !(XXIPBind id) 

Instances

Instances details
type Anno (IPBind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type LFixitySig pass = XRec pass (FixitySig pass) #

type LHsBind id = LHsBindLR id id #

type LHsBindLR idL idR = XRec idL (HsBindLR idL idR) #

type LHsBinds id = LHsBindsLR id id #

type LHsBindsLR idL idR = Bag (LHsBindLR idL idR) #

type LHsLocalBinds id = XRec id (HsLocalBinds id) #

type LHsLocalBindsLR idL idR = XRec idL (HsLocalBindsLR idL idR) #

type LIPBind id = XRec id (IPBind id) #

type LSig pass = XRec pass (Sig pass) #

data PatSynBind idL idR #

Constructors

PSB 

Fields

XPatSynBind !(XXPatSynBind idL idR) 

data Sig pass #

Constructors

TypeSig (XTypeSig pass) [LIdP pass] (LHsSigWcType pass) 
PatSynSig (XPatSynSig pass) [LIdP pass] (LHsSigType pass) 
ClassOpSig (XClassOpSig pass) Bool [LIdP pass] (LHsSigType pass) 
FixSig (XFixSig pass) (FixitySig pass) 
InlineSig (XInlineSig pass) (LIdP pass) InlinePragma 
SpecSig (XSpecSig pass) (LIdP pass) [LHsSigType pass] InlinePragma 
SpecInstSig (XSpecInstSig pass) (LHsSigType pass) 
MinimalSig (XMinimalSig pass) (LBooleanFormula (LIdP pass)) 
SCCFunSig (XSCCFunSig pass) (LIdP pass) (Maybe (XRec pass StringLiteral)) 
CompleteMatchSig (XCompleteMatchSig pass) (XRec pass [LIdP pass]) (Maybe (LIdP pass)) 
XSig !(XXSig pass) 

Instances

Instances details
type Anno (Sig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Binds

type family XFixitySig x #

Instances

Instances details
type XFixitySig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XHsIPBinds x x' #

Instances

Instances details
type XHsIPBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XPatSynBind x x' #

Instances

Instances details
type XPatSynBind (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type LHsToken (tok :: Symbol) p = XRec p (HsToken tok) #

type LHsUniToken (tok :: Symbol) (utok :: Symbol) p = XRec p (HsUniToken tok utok) #

data AnnDecl pass #

Constructors

HsAnnotation (XHsAnnotation pass) (AnnProvenance pass) (XRec pass (HsExpr pass)) 
XAnnDecl !(XXAnnDecl pass) 

Instances

Instances details
type Anno (AnnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data CImportSpec #

Constructors

CLabel CLabelString 
CFunction CCallTarget 
CWrapper 

Instances

Instances details
Data CImportSpec 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CImportSpec -> c CImportSpec

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CImportSpec

toConstr :: CImportSpec -> Constr

dataTypeOf :: CImportSpec -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CImportSpec)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CImportSpec)

gmapT :: (forall b. Data b => b -> b) -> CImportSpec -> CImportSpec

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CImportSpec -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CImportSpec -> r

gmapQ :: (forall d. Data d => d -> u) -> CImportSpec -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> CImportSpec -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec

data ClsInstDecl pass #

Instances

Instances details
type Anno (ClsInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data ConDecl pass #

Constructors

ConDeclGADT 

Fields

ConDeclH98 

Fields

XConDecl !(XXConDecl pass) 

Instances

Instances details
type Anno (ConDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data DataDefnCons a #

Constructors

NewTypeCon a 
DataTypeCons Bool [a] 

Instances

Instances details
Foldable DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

fold :: Monoid m => DataDefnCons m -> m

foldMap :: Monoid m => (a -> m) -> DataDefnCons a -> m

foldMap' :: Monoid m => (a -> m) -> DataDefnCons a -> m

foldr :: (a -> b -> b) -> b -> DataDefnCons a -> b

foldr' :: (a -> b -> b) -> b -> DataDefnCons a -> b

foldl :: (b -> a -> b) -> b -> DataDefnCons a -> b

foldl' :: (b -> a -> b) -> b -> DataDefnCons a -> b

foldr1 :: (a -> a -> a) -> DataDefnCons a -> a

foldl1 :: (a -> a -> a) -> DataDefnCons a -> a

toList :: DataDefnCons a -> [a]

null :: DataDefnCons a -> Bool

length :: DataDefnCons a -> Int

elem :: Eq a => a -> DataDefnCons a -> Bool

maximum :: Ord a => DataDefnCons a -> a

minimum :: Ord a => DataDefnCons a -> a

sum :: Num a => DataDefnCons a -> a

product :: Num a => DataDefnCons a -> a

Traversable DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

traverse :: Applicative f => (a -> f b) -> DataDefnCons a -> f (DataDefnCons b)

sequenceA :: Applicative f => DataDefnCons (f a) -> f (DataDefnCons a)

mapM :: Monad m => (a -> m b) -> DataDefnCons a -> m (DataDefnCons b)

sequence :: Monad m => DataDefnCons (m a) -> m (DataDefnCons a)

Functor DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

fmap :: (a -> b) -> DataDefnCons a -> DataDefnCons b

(<$) :: a -> DataDefnCons b -> DataDefnCons a

Data a => Data (DataDefnCons a) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataDefnCons a -> c (DataDefnCons a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DataDefnCons a)

toConstr :: DataDefnCons a -> Constr

dataTypeOf :: DataDefnCons a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DataDefnCons a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DataDefnCons a))

gmapT :: (forall b. Data b => b -> b) -> DataDefnCons a -> DataDefnCons a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataDefnCons a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataDefnCons a -> r

gmapQ :: (forall d. Data d => d -> u) -> DataDefnCons a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataDefnCons a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a)

Eq a => Eq (DataDefnCons a) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

(==) :: DataDefnCons a -> DataDefnCons a -> Bool

(/=) :: DataDefnCons a -> DataDefnCons a -> Bool

newtype DataFamInstDecl pass #

Constructors

DataFamInstDecl 

Fields

Instances

Instances details
type Anno (DataFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data DefaultDecl pass #

Constructors

DefaultDecl (XCDefaultDecl pass) [LHsType pass] 
XDefaultDecl !(XXDefaultDecl pass) 

Instances

Instances details
type Anno (DefaultDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data DerivClauseTys pass #

Constructors

DctSingle (XDctSingle pass) (LHsSigType pass) 
DctMulti (XDctMulti pass) [LHsSigType pass] 
XDerivClauseTys !(XXDerivClauseTys pass) 

Instances

Instances details
type Anno (DerivClauseTys (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

data DerivDecl pass #

Constructors

DerivDecl 
XDerivDecl !(XXDerivDecl pass) 

Instances

Instances details
type Anno (DerivDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data DerivStrategy pass #

Instances

Instances details
type Anno (DerivStrategy (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data DocDecl pass #

Constructors

DocCommentNext (LHsDoc pass) 
DocCommentPrev (LHsDoc pass) 
DocCommentNamed String (LHsDoc pass) 
DocGroup Int (LHsDoc pass) 

Instances

Instances details
(Data pass, Data (IdP pass)) => Data (DocDecl pass) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DocDecl pass -> c (DocDecl pass)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DocDecl pass)

toConstr :: DocDecl pass -> Constr

dataTypeOf :: DocDecl pass -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DocDecl pass))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DocDecl pass))

gmapT :: (forall b. Data b => b -> b) -> DocDecl pass -> DocDecl pass

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DocDecl pass -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DocDecl pass -> r

gmapQ :: (forall d. Data d => d -> u) -> DocDecl pass -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> DocDecl pass -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass)

type Anno (DocDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data FamEqn pass rhs #

Constructors

FamEqn 

Fields

XFamEqn !(XXFamEqn pass rhs) 

Instances

Instances details
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (FamEqn (GhcPass p) _1) 
Instance details

Defined in GHC.Hs.Decls

type Anno (FamEqn (GhcPass p) _1) = SrcSpanAnnA
type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

data FamilyDecl pass #

Constructors

FamilyDecl 

Fields

XFamilyDecl !(XXFamilyDecl pass) 

Instances

Instances details
type Anno (FamilyDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data FamilyInfo pass #

data FamilyResultSig pass #

Constructors

NoSig (XNoSig pass) 
KindSig (XCKindSig pass) (LHsKind pass) 
TyVarSig (XTyVarSig pass) (LHsTyVarBndr () pass) 
XFamilyResultSig !(XXFamilyResultSig pass) 

Instances

Instances details
type Anno (FamilyResultSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data ForeignDecl pass #

Instances

Instances details
type Anno (ForeignDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data ForeignExport pass #

Constructors

CExport (XCExport pass) (XRec pass CExportSpec) 
XForeignExport !(XXForeignExport pass) 

data ForeignImport pass #

Constructors

CImport (XCImport pass) (XRec pass CCallConv) (XRec pass Safety) (Maybe Header) CImportSpec 
XForeignImport !(XXForeignImport pass) 

data HsConDeclGADTDetails pass #

Constructors

PrefixConGADT [HsScaled pass (LBangType pass)] 
RecConGADT (XRec pass [LConDeclField pass]) (LHsUniToken "->" "\8594" pass) 

type HsConDeclH98Details pass = HsConDetails Void (HsScaled pass (LBangType pass)) (XRec pass [LConDeclField pass]) #

data HsDataDefn pass #

Constructors

HsDataDefn 

Fields

XHsDataDefn !(XXHsDataDefn pass) 

data HsDecl p #

Instances

Instances details
type Anno (HsDecl (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Decls

type HsDeriving pass = [LHsDerivingClause pass] #

data HsDerivingClause pass #

Instances

Instances details
type Anno (HsDerivingClause (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type HsTyPats pass = [LHsTypeArg pass] #

data InjectivityAnn pass #

Constructors

InjectivityAnn (XCInjectivityAnn pass) (LIdP pass) [LIdP pass] 
XInjectivityAnn !(XXInjectivityAnn pass) 

Instances

Instances details
type Anno (InjectivityAnn (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data InstDecl pass #

Instances

Instances details
type Anno (InstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type LAnnDecl pass = XRec pass (AnnDecl pass) #

type LClsInstDecl pass = XRec pass (ClsInstDecl pass) #

type LConDecl pass = XRec pass (ConDecl pass) #

type LDataFamInstDecl pass = XRec pass (DataFamInstDecl pass) #

type LDefaultDecl pass = XRec pass (DefaultDecl pass) #

type LDerivClauseTys pass = XRec pass (DerivClauseTys pass) #

type LDerivDecl pass = XRec pass (DerivDecl pass) #

type LDerivStrategy pass = XRec pass (DerivStrategy pass) #

type LDocDecl pass = XRec pass (DocDecl pass) #

type LFamilyDecl pass = XRec pass (FamilyDecl pass) #

type LFamilyResultSig pass = XRec pass (FamilyResultSig pass) #

type LForeignDecl pass = XRec pass (ForeignDecl pass) #

type LHsDecl p = XRec p (HsDecl p) #

type LHsDerivingClause pass = XRec pass (HsDerivingClause pass) #

type LHsFunDep pass = XRec pass (FunDep pass) #

type LInjectivityAnn pass = XRec pass (InjectivityAnn pass) #

type LInstDecl pass = XRec pass (InstDecl pass) #

type LRoleAnnotDecl pass = XRec pass (RoleAnnotDecl pass) #

type LRuleBndr pass = XRec pass (RuleBndr pass) #

type LRuleDecl pass = XRec pass (RuleDecl pass) #

type LRuleDecls pass = XRec pass (RuleDecls pass) #

type LSpliceDecl pass = XRec pass (SpliceDecl pass) #

type LStandaloneKindSig pass = XRec pass (StandaloneKindSig pass) #

type LTyClDecl pass = XRec pass (TyClDecl pass) #

type LTyFamDefltDecl pass = XRec pass (TyFamDefltDecl pass) #

type LTyFamInstDecl pass = XRec pass (TyFamInstDecl pass) #

type LTyFamInstEqn pass = XRec pass (TyFamInstEqn pass) #

type LWarnDecl pass = XRec pass (WarnDecl pass) #

type LWarnDecls pass = XRec pass (WarnDecls pass) #

data NewOrData #

Constructors

NewType 
DataType 

Instances

Instances details
Data NewOrData 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NewOrData -> c NewOrData

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NewOrData

toConstr :: NewOrData -> Constr

dataTypeOf :: NewOrData -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NewOrData)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NewOrData)

gmapT :: (forall b. Data b => b -> b) -> NewOrData -> NewOrData

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NewOrData -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NewOrData -> r

gmapQ :: (forall d. Data d => d -> u) -> NewOrData -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NewOrData -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData

Eq NewOrData 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

(==) :: NewOrData -> NewOrData -> Bool

(/=) :: NewOrData -> NewOrData -> Bool

data RoleAnnotDecl pass #

Constructors

RoleAnnotDecl (XCRoleAnnotDecl pass) (LIdP pass) [XRec pass (Maybe Role)] 
XRoleAnnotDecl !(XXRoleAnnotDecl pass) 

Instances

Instances details
type Anno (RoleAnnotDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data RuleBndr pass #

Constructors

RuleBndr (XCRuleBndr pass) (LIdP pass) 
RuleBndrSig (XRuleBndrSig pass) (LIdP pass) (HsPatSigType pass) 
XRuleBndr !(XXRuleBndr pass) 

Instances

Instances details
type Anno (RuleBndr (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data RuleDecl pass #

Constructors

HsRule 

Fields

XRuleDecl !(XXRuleDecl pass) 

Instances

Instances details
type Anno (RuleDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data RuleDecls pass #

Constructors

HsRules 

Fields

XRuleDecls !(XXRuleDecls pass) 

Instances

Instances details
type Anno (RuleDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data SpliceDecl p #

Instances

Instances details
type Anno (SpliceDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data SpliceDecoration #

Constructors

DollarSplice 
BareSplice 

Instances

Instances details
Data SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpliceDecoration -> c SpliceDecoration

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpliceDecoration

toConstr :: SpliceDecoration -> Constr

dataTypeOf :: SpliceDecoration -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpliceDecoration)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpliceDecoration)

gmapT :: (forall b. Data b => b -> b) -> SpliceDecoration -> SpliceDecoration

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpliceDecoration -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpliceDecoration -> r

gmapQ :: (forall d. Data d => d -> u) -> SpliceDecoration -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpliceDecoration -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration

Show SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

showsPrec :: Int -> SpliceDecoration -> ShowS

show :: SpliceDecoration -> String

showList :: [SpliceDecoration] -> ShowS

Eq SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

data StandaloneKindSig pass #

Instances

Instances details
type Anno (StandaloneKindSig (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data TyClDecl pass #

Constructors

FamDecl 

Fields

SynDecl 

Fields

DataDecl 

Fields

ClassDecl 

Fields

XTyClDecl !(XXTyClDecl pass) 

Instances

Instances details
type Anno (TyClDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data TyClGroup pass #

data TyFamInstDecl pass #

Instances

Instances details
type Anno (TyFamInstDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type TyFamInstEqn pass = FamEqn pass (LHsType pass) #

data WarnDecl pass #

Constructors

Warning (XWarning pass) [LIdP pass] (WarningTxt pass) 
XWarnDecl !(XXWarnDecl pass) 

Instances

Instances details
type Anno (WarnDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

data WarnDecls pass #

Constructors

Warnings 

Fields

XWarnDecls !(XXWarnDecls pass) 

Instances

Instances details
type Anno (WarnDecls (GhcPass p)) 
Instance details

Defined in GHC.Hs.Decls

type family XForeignExport x #

Instances

Instances details
type XForeignExport GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XForeignExport GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XForeignExport GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XForeignImport x #

Instances

Instances details
type XForeignImport GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XForeignImport GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XForeignImport GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XSpliceDecl x #

Instances

Instances details
type XSpliceDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XStandaloneKindSig x #

Instances

Instances details
type XStandaloneKindSig GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XStandaloneKindSig GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XStandaloneKindSig GhcTc 
Instance details

Defined in GHC.Hs.Decls

data ArithSeqInfo id #

Constructors

From (LHsExpr id) 
FromThen (LHsExpr id) (LHsExpr id) 
FromTo (LHsExpr id) (LHsExpr id) 
FromThenTo (LHsExpr id) (LHsExpr id) (LHsExpr id) 

type CmdLStmt id = LStmt id (LHsCmd id) #

type CmdStmt id = Stmt id (LHsCmd id) #

data DotFieldOcc p #

Constructors

DotFieldOcc 

Fields

XDotFieldOcc !(XXDotFieldOcc p) 

Instances

Instances details
type Anno (DotFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type ExprLStmt id = LStmt id (LHsExpr id) #

type ExprStmt id = Stmt id (LHsExpr id) #

type FailOperator id = Maybe (SyntaxExpr id) #

newtype FieldLabelStrings p #

Constructors

FieldLabelStrings [XRec p (DotFieldOcc p)] 

Instances

Instances details
type Anno (FieldLabelStrings (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

data GRHS p body #

Constructors

GRHS (XCGRHS p body) [GuardLStmt p] body 
XGRHS !(XXGRHS p body) 

Instances

Instances details
type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns

data GRHSs p body #

Constructors

GRHSs 

Fields

XGRHSs !(XXGRHSs p body) 

type GhciLStmt id = LStmt id (LHsExpr id) #

type GhciStmt id = Stmt id (LHsExpr id) #

type GuardLStmt id = LStmt id (LHsExpr id) #

type GuardStmt id = Stmt id (LHsExpr id) #

data HsArrAppType #

Instances

Instances details
Data HsArrAppType 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsArrAppType -> c HsArrAppType

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsArrAppType

toConstr :: HsArrAppType -> Constr

dataTypeOf :: HsArrAppType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsArrAppType)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsArrAppType)

gmapT :: (forall b. Data b => b -> b) -> HsArrAppType -> HsArrAppType

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsArrAppType -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsArrAppType -> r

gmapQ :: (forall d. Data d => d -> u) -> HsArrAppType -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsArrAppType -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType

data HsCmd id #

Constructors

HsCmdArrApp (XCmdArrApp id) (LHsExpr id) (LHsExpr id) HsArrAppType Bool 
HsCmdArrForm (XCmdArrForm id) (LHsExpr id) LexicalFixity (Maybe Fixity) [LHsCmdTop id] 
HsCmdApp (XCmdApp id) (LHsCmd id) (LHsExpr id) 
HsCmdLam (XCmdLam id) (MatchGroup id (LHsCmd id)) 
HsCmdPar (XCmdPar id) !(LHsToken "(" id) (LHsCmd id) !(LHsToken ")" id) 
HsCmdCase (XCmdCase id) (LHsExpr id) (MatchGroup id (LHsCmd id)) 
HsCmdLamCase (XCmdLamCase id) LamCaseVariant (MatchGroup id (LHsCmd id)) 
HsCmdIf (XCmdIf id) (SyntaxExpr id) (LHsExpr id) (LHsCmd id) (LHsCmd id) 
HsCmdLet (XCmdLet id) !(LHsToken "let" id) (HsLocalBinds id) !(LHsToken "in" id) (LHsCmd id) 
HsCmdDo (XCmdDo id) (XRec id [CmdLStmt id]) 
XCmd !(XXCmd id) 

Instances

Instances details
DisambECP (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

Associated Types

type Body (HsCmd GhcPs) :: Type -> Type

type InfixOp (HsCmd GhcPs)

type FunArg (HsCmd GhcPs)

Methods

ecpFromCmd' :: LHsCmd GhcPs -> PV (LocatedA (HsCmd GhcPs))

ecpFromExp' :: LHsExpr GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsProjUpdatePV :: SrcSpan -> Located [LocatedAn NoEpAnns (DotFieldOcc GhcPs)] -> LocatedA (HsCmd GhcPs) -> Bool -> [AddEpAnn] -> PV (LHsRecProj GhcPs (LocatedA (HsCmd GhcPs)))

mkHsLamPV :: SrcSpan -> (EpAnnComments -> MatchGroup GhcPs (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsLetPV :: SrcSpan -> LHsToken "let" GhcPs -> HsLocalBinds GhcPs -> LHsToken "in" GhcPs -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

superInfixOp :: (DisambInfixOp (InfixOp (HsCmd GhcPs)) => PV (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsOpAppPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> LocatedN (InfixOp (HsCmd GhcPs)) -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

mkHsCasePV :: SrcSpan -> LHsExpr GhcPs -> LocatedL [LMatch GhcPs (LocatedA (HsCmd GhcPs))] -> EpAnnHsCase -> PV (LocatedA (HsCmd GhcPs))

mkHsLamCasePV :: SrcSpan -> LamCaseVariant -> LocatedL [LMatch GhcPs (LocatedA (HsCmd GhcPs))] -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

superFunArg :: (DisambECP (FunArg (HsCmd GhcPs)) => PV (LocatedA (HsCmd GhcPs))) -> PV (LocatedA (HsCmd GhcPs))

mkHsAppPV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LocatedA (FunArg (HsCmd GhcPs)) -> PV (LocatedA (HsCmd GhcPs))

mkHsAppTypePV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LHsToken "@" GhcPs -> LHsType GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsIfPV :: SrcSpan -> LHsExpr GhcPs -> Bool -> LocatedA (HsCmd GhcPs) -> Bool -> LocatedA (HsCmd GhcPs) -> AnnsIf -> PV (LocatedA (HsCmd GhcPs))

mkHsDoPV :: SrcSpan -> Maybe ModuleName -> LocatedL [LStmt GhcPs (LocatedA (HsCmd GhcPs))] -> AnnList -> PV (LocatedA (HsCmd GhcPs))

mkHsParPV :: SrcSpan -> LHsToken "(" GhcPs -> LocatedA (HsCmd GhcPs) -> LHsToken ")" GhcPs -> PV (LocatedA (HsCmd GhcPs))

mkHsVarPV :: LocatedN RdrName -> PV (LocatedA (HsCmd GhcPs))

mkHsLitPV :: Located (HsLit GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsOverLitPV :: LocatedAn a (HsOverLit GhcPs) -> PV (LocatedAn a (HsCmd GhcPs))

mkHsWildCardPV :: SrcSpan -> PV (Located (HsCmd GhcPs))

mkHsTySigPV :: SrcSpanAnnA -> LocatedA (HsCmd GhcPs) -> LHsType GhcPs -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsExplicitListPV :: SrcSpan -> [LocatedA (HsCmd GhcPs)] -> AnnList -> PV (LocatedA (HsCmd GhcPs))

mkHsSplicePV :: Located (HsUntypedSplice GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsRecordPV :: Bool -> SrcSpan -> SrcSpan -> LocatedA (HsCmd GhcPs) -> ([Fbind (HsCmd GhcPs)], Maybe SrcSpan) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsNegAppPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsSectionR_PV :: SrcSpan -> LocatedA (InfixOp (HsCmd GhcPs)) -> LocatedA (HsCmd GhcPs) -> PV (Located (HsCmd GhcPs))

mkHsViewPatPV :: SrcSpan -> LHsExpr GhcPs -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsAsPatPV :: SrcSpan -> LocatedN RdrName -> LHsToken "@" GhcPs -> LocatedA (HsCmd GhcPs) -> PV (LocatedA (HsCmd GhcPs))

mkHsLazyPatPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkHsBangPatPV :: SrcSpan -> LocatedA (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

mkSumOrTuplePV :: SrcSpanAnnA -> Boxity -> SumOrTuple (HsCmd GhcPs) -> [AddEpAnn] -> PV (LocatedA (HsCmd GhcPs))

rejectPragmaPV :: LocatedA (HsCmd GhcPs) -> PV ()

type Body (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Body (HsCmd GhcPs) = HsCmd
type FunArg (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type FunArg (HsCmd GhcPs) = HsExpr GhcPs
type InfixOp (HsCmd GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type InfixOp (HsCmd GhcPs) = HsExpr GhcPs
type Anno (HsCmd (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

data HsCmdTop p #

Constructors

HsCmdTop (XCmdTop p) (LHsCmd p) 
XCmdTop !(XXCmdTop p) 

Instances

Instances details
type Anno (HsCmdTop (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

data HsLit x #

Constructors

HsChar (XHsChar x) Char 
HsCharPrim (XHsCharPrim x) Char 
HsString (XHsString x) FastString 
HsStringPrim (XHsStringPrim x) !ByteString 
HsInt (XHsInt x) IntegralLit 
HsIntPrim (XHsIntPrim x) Integer 
HsWordPrim (XHsWordPrim x) Integer 
HsInt64Prim (XHsInt64Prim x) Integer 
HsWord64Prim (XHsWord64Prim x) Integer 
HsInteger (XHsInteger x) Integer Type 
HsRat (XHsRat x) FractionalLit Type 
HsFloatPrim (XHsFloatPrim x) FractionalLit 
HsDoublePrim (XHsDoublePrim x) FractionalLit 
XLit !(XXLit x) 

Instances

Instances details
Eq (HsLit x) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsLit x -> HsLit x -> Bool

(/=) :: HsLit x -> HsLit x -> Bool

data HsOverLit p #

Constructors

OverLit 

Fields

XOverLit !(XXOverLit p) 

Instances

Instances details
Eq (XXOverLit p) => Eq (HsOverLit p) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsOverLit p -> HsOverLit p -> Bool

(/=) :: HsOverLit p -> HsOverLit p -> Bool

Ord (XXOverLit p) => Ord (HsOverLit p) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

compare :: HsOverLit p -> HsOverLit p -> Ordering

(<) :: HsOverLit p -> HsOverLit p -> Bool

(<=) :: HsOverLit p -> HsOverLit p -> Bool

(>) :: HsOverLit p -> HsOverLit p -> Bool

(>=) :: HsOverLit p -> HsOverLit p -> Bool

max :: HsOverLit p -> HsOverLit p -> HsOverLit p

min :: HsOverLit p -> HsOverLit p -> HsOverLit p

type Anno (HsOverLit (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

data HsPragE p #

Constructors

HsPragSCC (XSCC p) StringLiteral 
XHsPragE !(XXPragE p) 

data HsQuote p #

Constructors

ExpBr (XExpBr p) (LHsExpr p) 
PatBr (XPatBr p) (LPat p) 
DecBrL (XDecBrL p) [LHsDecl p] 
DecBrG (XDecBrG p) (HsGroup p) 
TypBr (XTypBr p) (LHsType p) 
VarBr (XVarBr p) Bool (LIdP p) 
XQuote !(XXQuote p) 

data HsTupArg id #

Constructors

Present (XPresent id) (LHsExpr id) 
Missing (XMissing id) 
XTupArg !(XXTupArg id) 

data HsUntypedSplice id #

Instances

Instances details
type Anno (HsUntypedSplice (GhcPass p)) 
Instance details

Defined in GHC.Hs.Expr

type LGRHS id body = XRec id (GRHS id body) #

type LHsCmd id = XRec id (HsCmd id) #

type LHsCmdTop p = XRec p (HsCmdTop p) #

type LHsRecProj p arg = XRec p (RecProj p arg) #

type LHsTupArg id = XRec id (HsTupArg id) #

type LMatch id body = XRec id (Match id body) #

type LStmt id body = XRec id (StmtLR id id body) #

type LStmtLR idL idR body = XRec idL (StmtLR idL idR body) #

data LamCaseVariant #

Constructors

LamCase 
LamCases 

Instances

Instances details
Data LamCaseVariant 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LamCaseVariant -> c LamCaseVariant

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LamCaseVariant

toConstr :: LamCaseVariant -> Constr

dataTypeOf :: LamCaseVariant -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LamCaseVariant)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LamCaseVariant)

gmapT :: (forall b. Data b => b -> b) -> LamCaseVariant -> LamCaseVariant

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LamCaseVariant -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LamCaseVariant -> r

gmapQ :: (forall d. Data d => d -> u) -> LamCaseVariant -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LamCaseVariant -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant

Eq LamCaseVariant 
Instance details

Defined in Language.Haskell.Syntax.Expr

data Match p body #

Constructors

Match 

Fields

XMatch !(XXMatch p body) 

Instances

Instances details
type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA

data MatchGroup p body #

Constructors

MG 

Fields

XMatchGroup !(XXMatchGroup p body) 

data ParStmtBlock idL idR #

Constructors

ParStmtBlock (XParStmtBlock idL idR) [ExprLStmt idL] [IdP idR] (SyntaxExpr idR) 
XParStmtBlock !(XXParStmtBlock idL idR) 

type RecUpdProj p = RecProj p (LHsExpr p) #

type Stmt id body = StmtLR id id body #

data StmtLR idL idR body #

Constructors

LastStmt (XLastStmt idL idR body) body (Maybe Bool) (SyntaxExpr idR) 
BindStmt (XBindStmt idL idR body) (LPat idL) body 
ApplicativeStmt (XApplicativeStmt idL idR body) [(SyntaxExpr idR, ApplicativeArg idL)] (Maybe (SyntaxExpr idR)) 
BodyStmt (XBodyStmt idL idR body) body (SyntaxExpr idR) (SyntaxExpr idR) 
LetStmt (XLetStmt idL idR body) (HsLocalBindsLR idL idR) 
ParStmt (XParStmt idL idR body) [ParStmtBlock idL idR] (HsExpr idR) (SyntaxExpr idR) 
TransStmt 

Fields

RecStmt 

Fields

XStmtLR !(XXStmtLR idL idR body) 

Instances

Instances details
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

type family SyntaxExpr p #

Instances

Instances details
type SyntaxExpr (GhcPass p) 
Instance details

Defined in GHC.Hs.Expr

data TransForm #

Constructors

ThenForm 
GroupForm 

Instances

Instances details
Data TransForm 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TransForm -> c TransForm

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TransForm

toConstr :: TransForm -> Constr

dataTypeOf :: TransForm -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TransForm)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TransForm)

gmapT :: (forall b. Data b => b -> b) -> TransForm -> TransForm

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TransForm -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TransForm -> r

gmapQ :: (forall d. Data d => d -> u) -> TransForm -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TransForm -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm

type family XCmdTop x #

Instances

Instances details
type XCmdTop GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdTop GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdTop GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XParStmtBlock x x' #

Instances

Instances details
type XParStmtBlock (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Expr

type family XUntypedSplice x #

Instances

Instances details
type XUntypedSplice GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSplice GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSplice GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family ImportDeclPkgQual x #

Instances

Instances details
type ImportDeclPkgQual GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type ImportDeclPkgQual GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type ImportDeclPkgQual GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type LIdP p = XRec p (IdP p) #

class WrapXRec p a where #

Methods

wrapXRec :: a -> XRec p a #

type family XAmbiguous x #

Instances

Instances details
type XAmbiguous GhcPs 
Instance details

Defined in GHC.Hs.Type

type XAmbiguous GhcRn 
Instance details

Defined in GHC.Hs.Type

type XAmbiguous GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XAnnD x #

Instances

Instances details
type XAnnD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XAnyClassStrategy x #

Instances

Instances details
type XAnyClassStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XAnyClassStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XAnyClassStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XApp x #

Instances

Instances details
type XApp (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XApp (GhcPass _1) = EpAnnCO

type family XAppKindTy x #

Instances

Instances details
type XAppKindTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XAppTy x #

Instances

Instances details
type XAppTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XAppTypeE x #

Instances

Instances details
type XAppTypeE GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XAppTypeE GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XAppTypeE GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XApplicativeArgMany x #

Instances

Instances details
type XApplicativeArgMany (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XApplicativeArgOne x #

Instances

Instances details
type XApplicativeArgOne GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeArgOne GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeArgOne GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XApplicativeStmt x x' b #

Instances

Instances details
type XApplicativeStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XApplicativeStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type family XArithSeq x #

Instances

Instances details
type XArithSeq GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XArithSeq GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XArithSeq GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XAsPat x #

Instances

Instances details
type XAsPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XAsPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XAsPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XBangPat x #

Instances

Instances details
type XBangPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XBangPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XBangPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XBangTy x #

Instances

Instances details
type XBangTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XBinTick x #

type family XBindStmt x x' b #

Instances

Instances details
type XBindStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XBindStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XBindStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type family XBodyStmt x x' b #

Instances

Instances details
type XBodyStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XBodyStmt (GhcPass _1) GhcTc b = Type

type family XCClsInstDecl x #

Instances

Instances details
type XCClsInstDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCClsInstDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCClsInstDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XCDefaultDecl x #

Instances

Instances details
type XCDefaultDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCDefaultDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCDefaultDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XCDerivDecl x #

Instances

Instances details
type XCDerivDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCDotFieldOcc x #

Instances

Instances details
type XCDotFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XCExport x #

Instances

Instances details
type XCExport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCExport (GhcPass _1) = Located SourceText

type family XCFamEqn x r #

Instances

Instances details
type XCFamEqn (GhcPass _1) r 
Instance details

Defined in GHC.Hs.Decls

type XCFamEqn (GhcPass _1) r = EpAnn [AddEpAnn]

type family XCFamilyDecl x #

Instances

Instances details
type XCFamilyDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCFieldOcc x #

Instances

Instances details
type XCFieldOcc GhcPs 
Instance details

Defined in GHC.Hs.Type

type XCFieldOcc GhcRn 
Instance details

Defined in GHC.Hs.Type

type XCFieldOcc GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XCFunDep x #

Instances

Instances details
type XCFunDep (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCGRHS x b #

Instances

Instances details
type XCGRHS (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type XCGRHS (GhcPass _1) _2 = EpAnn GrhsAnn

type family XCGRHSs x b #

Instances

Instances details
type XCGRHSs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type family XCHsDataDefn x #

Instances

Instances details
type XCHsDataDefn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCHsDerivingClause x #

Instances

Instances details
type XCHsDerivingClause (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCHsGroup x #

Instances

Instances details
type XCHsGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCIPBind x #

Instances

Instances details
type XCIPBind GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XCIPBind GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XCIPBind GhcTc 
Instance details

Defined in GHC.Hs.Binds

type family XCImport x #

Instances

Instances details
type XCImport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XCImport (GhcPass _1) = Located SourceText

type family XCImportDecl x #

Instances

Instances details
type XCImportDecl GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcPs = XImportDeclPass
type XCImportDecl GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcRn = XImportDeclPass
type XCImportDecl GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type family XCInjectivityAnn x #

Instances

Instances details
type XCInjectivityAnn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCKindSig x #

Instances

Instances details
type XCKindSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCMatch x b #

Instances

Instances details
type XCMatch (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type XCMatch (GhcPass _1) b = EpAnn [AddEpAnn]

type family XCModule x #

Instances

Instances details
type XCModule GhcPs 
Instance details

Defined in GHC.Hs

type XCModule GhcPs = XModulePs
type XCModule GhcRn 
Instance details

Defined in GHC.Hs

type XCModule GhcTc 
Instance details

Defined in GHC.Hs

type family XCRoleAnnotDecl x #

Instances

Instances details
type XCRoleAnnotDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCRoleAnnotDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCRoleAnnotDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XCRuleBndr x #

Instances

Instances details
type XCRuleBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCRuleDecls x #

Instances

Instances details
type XCRuleDecls GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcPs = (EpAnn [AddEpAnn], SourceText)
type XCRuleDecls GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcRn = SourceText
type XCRuleDecls GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcTc = SourceText

type family XCTyClGroup x #

Instances

Instances details
type XCTyClGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCTyFamInstDecl x #

Instances

Instances details
type XCTyFamInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCase x #

Instances

Instances details
type XCase GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCase GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCase GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCharTy x #

Instances

Instances details
type XCharTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XCharTy (GhcPass _1) = SourceText

type family XClassDecl x #

Instances

Instances details
type XClassDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcRn = NameSet
type XClassDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XClassDecl GhcTc = NameSet

type family XClassOpSig x #

Instances

Instances details
type XClassOpSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XClsInstD x #

Instances

Instances details
type XClsInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XCmdApp x #

Instances

Instances details
type XCmdApp (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdApp (GhcPass _1) = EpAnnCO

type family XCmdArrApp x #

Instances

Instances details
type XCmdArrApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdArrForm x #

Instances

Instances details
type XCmdArrForm GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrForm GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdArrForm GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdCase x #

Instances

Instances details
type XCmdCase GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdCase GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdCase GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdDo x #

Instances

Instances details
type XCmdDo GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdDo GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdDo GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdIf x #

Instances

Instances details
type XCmdIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdLam x #

Instances

Instances details
type XCmdLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XCmdLamCase x #

Instances

Instances details
type XCmdLamCase (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XCmdLet x #

Instances

Instances details
type XCmdLet GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XCmdLet GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XCmdLet GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XCmdPar x #

Instances

Instances details
type XCmdPar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XCmdPar (GhcPass _1) = EpAnnCO

type family XCmdWrap x #

Instances

Instances details
type XCmdWrap (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XCoPat x #

type family XCompleteMatchSig x #

Instances

Instances details
type XCompleteMatchSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XCompleteMatchSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)

type family XConDeclField x #

Instances

Instances details
type XConDeclField (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XConDeclGADT x #

Instances

Instances details
type XConDeclGADT (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XConDeclH98 x #

Instances

Instances details
type XConDeclH98 (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XConPat x #

Instances

Instances details
type XConPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XConPat GhcTc = ConPatTc

type family XDataDecl x #

Instances

Instances details
type XDataDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcRn = DataDeclRn
type XDataDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XDataDecl GhcTc = DataDeclRn

type family XDataFamInstD x #

Instances

Instances details
type XDataFamInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDctMulti x #

Instances

Instances details
type XDctMulti (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDctSingle x #

Instances

Instances details
type XDctSingle (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDecBrG x #

Instances

Instances details
type XDecBrG GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDecBrG GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDecBrG GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XDecBrL x #

Instances

Instances details
type XDecBrL GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDecBrL GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDecBrL GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XDefD x #

Instances

Instances details
type XDefD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDerivD x #

Instances

Instances details
type XDerivD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDo x #

Instances

Instances details
type XDo GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XDo GhcTc = Type

type family XDocD x #

Instances

Instances details
type XDocD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XDocTy x #

Instances

Instances details
type XDocTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XEmptyLocalBinds x x' #

Instances

Instances details
type XEmptyLocalBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XExpBr x #

Instances

Instances details
type XExpBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExpBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExpBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XExplicitList x #

Instances

Instances details
type XExplicitList GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitList GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitList GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XExplicitListTy x #

Instances

Instances details
type XExplicitListTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XExplicitListTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XExplicitListTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XExplicitSum x #

Instances

Instances details
type XExplicitSum GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitSum GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitSum GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XExplicitTuple x #

Instances

Instances details
type XExplicitTuple GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTuple GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExplicitTuple GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XExplicitTupleTy x #

Instances

Instances details
type XExplicitTupleTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XExplicitTupleTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XExplicitTupleTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XExprWithTySig x #

Instances

Instances details
type XExprWithTySig GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XExprWithTySig GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XExprWithTySig GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XFamDecl x #

Instances

Instances details
type XFamDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XFixSig x #

Instances

Instances details
type XFixSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XForAllTy x #

Instances

Instances details
type XForAllTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XForD x #

Instances

Instances details
type XForD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XFunBind x x' #

Instances

Instances details
type XFunBind (GhcPass pL) GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcRn = NameSet
type XFunBind (GhcPass pL) GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XFunBind (GhcPass pL) GhcTc = (HsWrapper, [CoreTickish])

type family XFunTy x #

Instances

Instances details
type XFunTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XFunTy (GhcPass _1) = EpAnnCO

type family XGetField x #

Instances

Instances details
type XGetField GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XGetField GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XGetField GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XHsAnnotation x #

Instances

Instances details
type XHsAnnotation (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type XHsAnnotation (GhcPass _1) = (EpAnn AnnPragma, SourceText)

type family XHsChar x #

Instances

Instances details
type XHsChar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsChar (GhcPass _1) = SourceText

type family XHsCharPrim x #

Instances

Instances details
type XHsCharPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsCharPrim (GhcPass _1) = SourceText

type family XHsDoublePrim x #

Instances

Instances details
type XHsDoublePrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XHsFieldBind x #

Instances

Instances details
type XHsFieldBind _1 
Instance details

Defined in GHC.Hs.Pat

type family XHsFloatPrim x #

Instances

Instances details
type XHsFloatPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XHsForAllInvis x #

Instances

Instances details
type XHsForAllInvis (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XHsForAllInvis (GhcPass _1) = EpAnnForallTy

type family XHsForAllVis x #

Instances

Instances details
type XHsForAllVis (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XHsForAllVis (GhcPass _1) = EpAnnForallTy

type family XHsInt x #

Instances

Instances details
type XHsInt (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XHsInt64Prim x #

Instances

Instances details
type XHsInt64Prim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsInt64Prim (GhcPass _1) = SourceText

type family XHsIntPrim x #

Instances

Instances details
type XHsIntPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsIntPrim (GhcPass _1) = SourceText

type family XHsInteger x #

Instances

Instances details
type XHsInteger (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsInteger (GhcPass _1) = SourceText

type family XHsOuterExplicit x flag #

Instances

Instances details
type XHsOuterExplicit GhcPs _1 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcPs _1 = EpAnnForallTy
type XHsOuterExplicit GhcRn _1 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcTc flag 
Instance details

Defined in GHC.Hs.Type

type XHsOuterExplicit GhcTc flag = [VarBndr TyVar flag]

type family XHsOuterImplicit x #

Instances

Instances details
type XHsOuterImplicit GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsOuterImplicit GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsOuterImplicit GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XHsPS x #

Instances

Instances details
type XHsPS GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcRn = HsPSRn
type XHsPS GhcTc 
Instance details

Defined in GHC.Hs.Type

type XHsPS GhcTc = HsPSRn

type family XHsQTvs x #

Instances

Instances details
type XHsQTvs GhcPs 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcRn 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcRn = HsQTvsRn
type XHsQTvs GhcTc 
Instance details

Defined in GHC.Hs.Type

type XHsQTvs GhcTc = HsQTvsRn

type family XHsRat x #

Instances

Instances details
type XHsRat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XHsRule x #

Instances

Instances details
type XHsRule GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcPs = (EpAnn HsRuleAnn, SourceText)
type XHsRule GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcRn = (HsRuleRn, SourceText)
type XHsRule GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcTc = (HsRuleRn, SourceText)

type family XHsSig x #

Instances

Instances details
type XHsSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XHsString x #

Instances

Instances details
type XHsString (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsString (GhcPass _1) = SourceText

type family XHsStringPrim x #

Instances

Instances details
type XHsStringPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsStringPrim (GhcPass _1) = SourceText

type family XHsValBinds x x' #

Instances

Instances details
type XHsValBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XHsWC x b #

Instances

Instances details
type XHsWC GhcPs b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcRn b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcRn b = [Name]
type XHsWC GhcTc b 
Instance details

Defined in GHC.Hs.Type

type XHsWC GhcTc b = [Name]

type family XHsWord64Prim x #

Instances

Instances details
type XHsWord64Prim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsWord64Prim (GhcPass _1) = SourceText

type family XHsWordPrim x #

Instances

Instances details
type XHsWordPrim (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type XHsWordPrim (GhcPass _1) = SourceText

type family XIEDoc x #

Instances

Instances details
type XIEDoc (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEDocNamed x #

Instances

Instances details
type XIEDocNamed (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEGroup x #

Instances

Instances details
type XIEGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEModuleContents x #

Instances

Instances details
type XIEModuleContents GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XIEModuleContents GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XIEModuleContents GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEName p #

Instances

Instances details
type XIEName (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEPattern p #

Instances

Instances details
type XIEPattern (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEThingAbs x #

Instances

Instances details
type XIEThingAbs (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEThingAll x #

Instances

Instances details
type XIEThingAll (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEThingWith x #

Instances

Instances details
type XIEThingWith (GhcPass 'Parsed) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingWith (GhcPass 'Renamed) 
Instance details

Defined in GHC.Hs.ImpExp

type XIEThingWith (GhcPass 'Renamed) = [Located FieldLabel]
type XIEThingWith (GhcPass 'Typechecked) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEType p #

Instances

Instances details
type XIEType (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEVar x #

Instances

Instances details
type XIEVar GhcPs 
Instance details

Defined in GHC.Hs.ImpExp

type XIEVar GhcRn 
Instance details

Defined in GHC.Hs.ImpExp

type XIEVar GhcTc 
Instance details

Defined in GHC.Hs.ImpExp

type family XIPBinds x #

Instances

Instances details
type XIPBinds GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XIPBinds GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XIPBinds GhcTc 
Instance details

Defined in GHC.Hs.Binds

type family XIPVar x #

Instances

Instances details
type XIPVar GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XIPVar GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XIPVar GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XIParamTy x #

Instances

Instances details
type XIParamTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XIdSig x #

type family XIf x #

Instances

Instances details
type XIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XInlineSig x #

Instances

Instances details
type XInlineSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XInstD x #

Instances

Instances details
type XInstD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XKindSig x #

Instances

Instances details
type XKindSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XKindSigD x #

Instances

Instances details
type XKindSigD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XKindedTyVar x #

Instances

Instances details
type XKindedTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XLam x #

Instances

Instances details
type XLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLam (GhcPass _1) = NoExtField
type XLam (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLam (GhcPass _1) = NoExtField

type family XLamCase x #

Instances

Instances details
type XLamCase (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XLastStmt x x' b #

Instances

Instances details
type XLastStmt (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type XLastStmt (GhcPass _1) (GhcPass _2) b = NoExtField

type family XLazyPat x #

Instances

Instances details
type XLazyPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XLazyPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XLazyPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XLet x #

Instances

Instances details
type XLet GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XLet GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XLet GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XLetStmt x x' b #

Instances

Instances details
type XLetStmt (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type XLetStmt (GhcPass _1) (GhcPass _2) b = EpAnn [AddEpAnn]

type family XListPat x #

Instances

Instances details
type XListPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XListPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XListPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XListTy x #

Instances

Instances details
type XListTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XLitE x #

Instances

Instances details
type XLitE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XLitE (GhcPass _1) = EpAnnCO

type family XLitPat x #

Instances

Instances details
type XLitPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type family XMG x b #

Instances

Instances details
type XMG GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcPs b = Origin
type XMG GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcRn b = Origin
type XMG GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type family XMinimalSig x #

Instances

Instances details
type XMinimalSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XMinimalSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)

type family XMissing x #

Instances

Instances details
type XMissing GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XMissing GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XMissing GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XMultiIf x #

Instances

Instances details
type XMultiIf GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XMultiIf GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XMultiIf GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XNPat x #

Instances

Instances details
type XNPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XNPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XNPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XNPlusKPat x #

Instances

Instances details
type XNPlusKPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XNPlusKPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XNPlusKPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XNegApp x #

Instances

Instances details
type XNegApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XNegApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XNegApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XNewtypeStrategy x #

Instances

Instances details
type XNewtypeStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XNewtypeStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XNewtypeStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XNoSig x #

Instances

Instances details
type XNoSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XNumTy x #

Instances

Instances details
type XNumTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XNumTy (GhcPass _1) = SourceText

type family XOpApp x #

Instances

Instances details
type XOpApp GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XOpApp GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XOpApp GhcRn = Fixity
type XOpApp GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XOpTy x #

Instances

Instances details
type XOpTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XOpTy (GhcPass _1) = EpAnn [AddEpAnn]

type family XOverLabel x #

Instances

Instances details
type XOverLabel GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XOverLabel GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XOverLabel GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XOverLit x #

Instances

Instances details
type XOverLit GhcPs 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcRn 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcRn = OverLitRn
type XOverLit GhcTc 
Instance details

Defined in GHC.Hs.Lit

type XOverLit GhcTc = OverLitTc

type family XOverLitE x #

Instances

Instances details
type XOverLitE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XPSB x x' #

Instances

Instances details
type XPSB (GhcPass idL) GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcRn = NameSet
type XPSB (GhcPass idL) GhcTc 
Instance details

Defined in GHC.Hs.Binds

type XPSB (GhcPass idL) GhcTc = NameSet

type family XPar x #

Instances

Instances details
type XPar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XPar (GhcPass _1) = EpAnnCO

type family XParPat x #

Instances

Instances details
type XParPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type XParPat (GhcPass _1) = EpAnnCO

type family XParStmt x x' b #

Instances

Instances details
type XParStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type XParStmt (GhcPass _1) GhcTc b = Type

type family XParTy x #

Instances

Instances details
type XParTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XPatBind x x' #

Instances

Instances details
type XPatBind GhcPs (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcRn (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcRn (GhcPass pR) = NameSet
type XPatBind GhcTc (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type XPatBind GhcTc (GhcPass pR) = (Type, ([CoreTickish], [[CoreTickish]]))

type family XPatBr x #

Instances

Instances details
type XPatBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XPatBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XPatBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XPatSynSig x #

Instances

Instances details
type XPatSynSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XPragE x #

Instances

Instances details
type XPragE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XPresent x #

Instances

Instances details
type XPresent (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XProc x #

Instances

Instances details
type XProc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XProc (GhcPass _1) = EpAnn [AddEpAnn]

type family XProjection x #

Instances

Instances details
type XProjection GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XProjection GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XProjection GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XQualTy x #

Instances

Instances details
type XQualTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XQuasiQuote x #

Instances

Instances details
type XQuasiQuote p 
Instance details

Defined in GHC.Hs.Expr

type family XRecSel x #

Instances

Instances details
type XRecSel GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecSel GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecSel GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XRecStmt x x' b #

Instances

Instances details
type XRecStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XRecStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XRecStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type family XRecTy x #

Instances

Instances details
type XRecTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XRecTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XRecTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XRecordCon x #

Instances

Instances details
type XRecordCon GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecordCon GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecordCon GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XRecordUpd x #

Instances

Instances details
type XRecordUpd GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XRecordUpd GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XRecordUpd GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XRoleAnnotD x #

Instances

Instances details
type XRoleAnnotD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XRuleBndrSig x #

Instances

Instances details
type XRuleBndrSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XRuleD x #

Instances

Instances details
type XRuleD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XSCC x #

Instances

Instances details
type XSCC (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XSCC (GhcPass _1) = (EpAnn AnnPragma, SourceText)

type family XSCCFunSig x #

Instances

Instances details
type XSCCFunSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XSCCFunSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)

type family XSectionL x #

Instances

Instances details
type XSectionL GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XSectionL GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XSectionL GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XSectionR x #

Instances

Instances details
type XSectionR GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XSectionR GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XSectionR GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XSigD x #

Instances

Instances details
type XSigD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XSigPat x #

Instances

Instances details
type XSigPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSigPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSigPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XSpecInstSig x #

Instances

Instances details
type XSpecInstSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type XSpecInstSig (GhcPass p) = (EpAnn [AddEpAnn], SourceText)

type family XSpecSig x #

Instances

Instances details
type XSpecSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XSpliceD x #

Instances

Instances details
type XSpliceD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XSplicePat x #

Instances

Instances details
type XSplicePat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSplicePat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSplicePat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XSpliceTy x #

Instances

Instances details
type XSpliceTy GhcPs 
Instance details

Defined in GHC.Hs.Type

type XSpliceTy GhcRn 
Instance details

Defined in GHC.Hs.Type

type XSpliceTy GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XStarTy x #

Instances

Instances details
type XStarTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XStatic x #

Instances

Instances details
type XStatic GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcRn = NameSet
type XStatic GhcTc 
Instance details

Defined in GHC.Hs.Expr

type XStatic GhcTc = (NameSet, Type)

type family XStockStrategy x #

Instances

Instances details
type XStockStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XStockStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XStockStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XStrTy x #

Instances

Instances details
type XStrTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XStrTy (GhcPass _1) = SourceText

type family XSumPat x #

Instances

Instances details
type XSumPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcPs = EpAnn EpAnnSumPat
type XSumPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XSumPat GhcTc = [Type]

type family XSumTy x #

Instances

Instances details
type XSumTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XSynDecl x #

Instances

Instances details
type XSynDecl GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcRn = NameSet
type XSynDecl GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XSynDecl GhcTc = NameSet

type family XTick x #

type family XTransStmt x x' b #

Instances

Instances details
type XTransStmt (GhcPass _1) GhcPs b 
Instance details

Defined in GHC.Hs.Expr

type XTransStmt (GhcPass _1) GhcRn b 
Instance details

Defined in GHC.Hs.Expr

type XTransStmt (GhcPass _1) GhcTc b 
Instance details

Defined in GHC.Hs.Expr

type family XTuplePat x #

Instances

Instances details
type XTuplePat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XTuplePat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XTuplePat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XTupleTy x #

Instances

Instances details
type XTupleTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XTyClD x #

Instances

Instances details
type XTyClD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XTyFamInstD x #

Instances

Instances details
type XTyFamInstD GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XTyFamInstD GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XTyFamInstD GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XTyLit x #

Instances

Instances details
type XTyLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XTyVar x #

Instances

Instances details
type XTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XTyVarSig x #

Instances

Instances details
type XTyVarSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XTypBr x #

Instances

Instances details
type XTypBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XTypeSig x #

Instances

Instances details
type XTypeSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XTypedBracket x #

Instances

Instances details
type XTypedBracket GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypedBracket GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypedBracket GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XTypedSplice x #

Instances

Instances details
type XTypedSplice GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XTypedSplice GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XTypedSplice GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XUnambiguous x #

Instances

Instances details
type XUnambiguous GhcPs 
Instance details

Defined in GHC.Hs.Type

type XUnambiguous GhcRn 
Instance details

Defined in GHC.Hs.Type

type XUnambiguous GhcTc 
Instance details

Defined in GHC.Hs.Type

type family XUnboundVar x #

Instances

Instances details
type XUnboundVar GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUnboundVar GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUnboundVar GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XUntypedBracket x #

Instances

Instances details
type XUntypedBracket GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedBracket GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedBracket GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XUntypedSpliceExpr x #

Instances

Instances details
type XUntypedSpliceExpr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSpliceExpr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XUntypedSpliceExpr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XUserTyVar x #

Instances

Instances details
type XUserTyVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XValBinds x x' #

Instances

Instances details
type XValBinds (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XValD x #

Instances

Instances details
type XValD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XVar x #

Instances

Instances details
type XVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XVar (GhcPass _1) = NoExtField
type XVar (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type XVar (GhcPass _1) = NoExtField

type family XVarBind x x' #

Instances

Instances details
type XVarBind (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XVarBr x #

Instances

Instances details
type XVarBr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XVarBr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XVarBr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XVarPat x #

Instances

Instances details
type XVarPat (GhcPass _1) 
Instance details

Defined in GHC.Hs.Pat

type family XViaStrategy x #

Instances

Instances details
type XViaStrategy GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcPs = XViaStrategyPs
type XViaStrategy GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcTc 
Instance details

Defined in GHC.Hs.Decls

type family XViewPat x #

Instances

Instances details
type XViewPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XViewPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XViewPat GhcRn = Maybe (HsExpr GhcRn)
type XViewPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XWarning x #

Instances

Instances details
type XWarning (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XWarningD x #

Instances

Instances details
type XWarningD (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XWarnings x #

Instances

Instances details
type XWarnings GhcPs 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcPs = (EpAnn [AddEpAnn], SourceText)
type XWarnings GhcRn 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcRn = SourceText
type XWarnings GhcTc 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcTc = SourceText

type family XWildCardTy x #

Instances

Instances details
type XWildCardTy (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XWildPat x #

Instances

Instances details
type XWildPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XWildPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XWildPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type family XXAmbiguousFieldOcc x #

Instances

Instances details
type XXAmbiguousFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXAnnDecl x #

Instances

Instances details
type XXAnnDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXApplicativeArg x #

Instances

Instances details
type XXApplicativeArg (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XXClsInstDecl x #

Instances

Instances details
type XXClsInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXCmd x #

Instances

Instances details
type XXCmd GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXCmd GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXCmd GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XXCmdTop x #

Instances

Instances details
type XXCmdTop (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XXConDecl x #

Instances

Instances details
type XXConDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXConDeclField x #

Instances

Instances details
type XXConDeclField (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXDefaultDecl x #

Instances

Instances details
type XXDefaultDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXDerivClauseTys x #

Instances

Instances details
type XXDerivClauseTys (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXDerivDecl x #

Instances

Instances details
type XXDerivDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXDotFieldOcc x #

Instances

Instances details
type XXDotFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XXExpr x #

Instances

Instances details
type XXExpr GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXExpr GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXExpr GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XXFamEqn x r #

Instances

Instances details
type XXFamEqn (GhcPass _1) r 
Instance details

Defined in GHC.Hs.Decls

type family XXFamilyDecl x #

Instances

Instances details
type XXFamilyDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXFamilyResultSig x #

Instances

Instances details
type XXFamilyResultSig (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXFieldOcc x #

Instances

Instances details
type XXFieldOcc (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXFixitySig x #

Instances

Instances details
type XXFixitySig (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XXForeignDecl x #

Instances

Instances details
type XXForeignDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXForeignExport x #

Instances

Instances details
type XXForeignExport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXForeignImport x #

Instances

Instances details
type XXForeignImport (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXFunDep x #

Instances

Instances details
type XXFunDep (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXGRHS x b #

Instances

Instances details
type XXGRHS (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type family XXGRHSs x b #

Instances

Instances details
type XXGRHSs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Expr

type family XXHsBindsLR x x' #

Instances

Instances details
type XXHsBindsLR GhcPs pR 
Instance details

Defined in GHC.Hs.Binds

type XXHsBindsLR GhcRn pR 
Instance details

Defined in GHC.Hs.Binds

type XXHsBindsLR GhcTc pR 
Instance details

Defined in GHC.Hs.Binds

type family XXHsDataDefn x #

Instances

Instances details
type XXHsDataDefn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXHsDecl x #

Instances

Instances details
type XXHsDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXHsDerivingClause x #

Instances

Instances details
type XXHsDerivingClause (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXHsForAllTelescope x #

Instances

Instances details
type XXHsForAllTelescope (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXHsGroup x #

Instances

Instances details
type XXHsGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXHsIPBinds x #

Instances

Instances details
type XXHsIPBinds (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XXHsLocalBindsLR x x' #

Instances

Instances details
type XXHsLocalBindsLR (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Binds

type family XXHsOuterTyVarBndrs x #

Instances

Instances details
type XXHsOuterTyVarBndrs (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXHsPatSigType x #

Instances

Instances details
type XXHsPatSigType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXHsSigType x #

Instances

Instances details
type XXHsSigType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXHsWildCardBndrs x b #

Instances

Instances details
type XXHsWildCardBndrs (GhcPass _1) _2 
Instance details

Defined in GHC.Hs.Type

type family XXIE x #

Instances

Instances details
type XXIE (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XXIEWrappedName p #

Instances

Instances details
type XXIEWrappedName (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XXIPBind x #

Instances

Instances details
type XXIPBind (GhcPass p) 
Instance details

Defined in GHC.Hs.Binds

type family XXImportDecl x #

Instances

Instances details
type XXImportDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.ImpExp

type family XXInjectivityAnn x #

Instances

Instances details
type XXInjectivityAnn (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXInstDecl x #

Instances

Instances details
type XXInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXLHsQTyVars x #

Instances

Instances details
type XXLHsQTyVars (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXLit x #

Instances

Instances details
type XXLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XXMatch x b #

Instances

Instances details
type XXMatch (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type family XXMatchGroup x b #

Instances

Instances details
type XXMatchGroup (GhcPass _1) b 
Instance details

Defined in GHC.Hs.Expr

type family XXModule x #

Instances

Instances details
type XXModule p 
Instance details

Defined in GHC.Hs

type family XXOverLit x #

Instances

Instances details
type XXOverLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Lit

type family XXParStmtBlock x x' #

Instances

Instances details
type XXParStmtBlock (GhcPass pL) (GhcPass pR) 
Instance details

Defined in GHC.Hs.Expr

type family XXPat x #

Instances

Instances details
type XXPat GhcPs 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcRn 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcRn = HsPatExpansion (Pat GhcRn) (Pat GhcRn)
type XXPat GhcTc 
Instance details

Defined in GHC.Hs.Pat

type XXPat GhcTc = XXPatGhcTc

type family XXPatSynBind x x' #

Instances

Instances details
type XXPatSynBind (GhcPass idL) (GhcPass idR) 
Instance details

Defined in GHC.Hs.Binds

type family XXPragE x #

Instances

Instances details
type XXPragE (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XXQuote x #

Instances

Instances details
type XXQuote GhcPs 
Instance details

Defined in GHC.Hs.Expr

type XXQuote GhcRn 
Instance details

Defined in GHC.Hs.Expr

type XXQuote GhcTc 
Instance details

Defined in GHC.Hs.Expr

type family XXRoleAnnotDecl x #

Instances

Instances details
type XXRoleAnnotDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleBndr x #

Instances

Instances details
type XXRuleBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleDecl x #

Instances

Instances details
type XXRuleDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleDecls x #

Instances

Instances details
type XXRuleDecls (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXSig x #

Instances

Instances details
type XXSig GhcPs 
Instance details

Defined in GHC.Hs.Binds

type XXSig GhcRn 
Instance details

Defined in GHC.Hs.Binds

type XXSig GhcTc 
Instance details

Defined in GHC.Hs.Binds

type family XXSpliceDecl x #

Instances

Instances details
type XXSpliceDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXStandaloneKindSig x #

Instances

Instances details
type XXStandaloneKindSig (GhcPass p) 
Instance details

Defined in GHC.Hs.Decls

type family XXStmtLR x x' b #

Instances

Instances details
type XXStmtLR (GhcPass _1) (GhcPass _2) b 
Instance details

Defined in GHC.Hs.Expr

type family XXTupArg x #

Instances

Instances details
type XXTupArg (GhcPass _1) 
Instance details

Defined in GHC.Hs.Expr

type family XXTyClDecl x #

Instances

Instances details
type XXTyClDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXTyClGroup x #

Instances

Instances details
type XXTyClGroup (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXTyFamInstDecl x #

Instances

Instances details
type XXTyFamInstDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXTyLit x #

Instances

Instances details
type XXTyLit (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXTyVarBndr x #

Instances

Instances details
type XXTyVarBndr (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type family XXType x #

Instances

Instances details
type XXType (GhcPass _1) 
Instance details

Defined in GHC.Hs.Type

type XXType (GhcPass _1) = HsCoreTy

type family XXUntypedSplice x #

Instances

Instances details
type XXUntypedSplice p 
Instance details

Defined in GHC.Hs.Expr

type family XXValBindsLR x x' #

Instances

Instances details
type XXValBindsLR (GhcPass pL) pR 
Instance details

Defined in GHC.Hs.Binds

type family XXWarnDecl x #

Instances

Instances details
type XXWarnDecl (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

type family XXWarnDecls x #

Instances

Instances details
type XXWarnDecls (GhcPass _1) 
Instance details

Defined in GHC.Hs.Decls

data IEWildcard #

Constructors

NoIEWildcard 
IEWildcard Int 

Instances

Instances details
Data IEWildcard 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IEWildcard -> c IEWildcard

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IEWildcard

toConstr :: IEWildcard -> Constr

dataTypeOf :: IEWildcard -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IEWildcard)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IEWildcard)

gmapT :: (forall b. Data b => b -> b) -> IEWildcard -> IEWildcard

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IEWildcard -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IEWildcard -> r

gmapQ :: (forall d. Data d => d -> u) -> IEWildcard -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> IEWildcard -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard

Eq IEWildcard 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

(==) :: IEWildcard -> IEWildcard -> Bool

(/=) :: IEWildcard -> IEWildcard -> Bool

data IEWrappedName p #

Instances

Instances details
type Anno (IEWrappedName (GhcPass _1)) 
Instance details

Defined in GHC.Hs.ImpExp

data ImportDecl pass #

Instances

Instances details
type Anno (ImportDecl (GhcPass p)) 
Instance details

Defined in GHC.Hs.ImpExp

data ImportDeclQualifiedStyle #

Instances

Instances details
Data ImportDeclQualifiedStyle 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportDeclQualifiedStyle -> c ImportDeclQualifiedStyle

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportDeclQualifiedStyle

toConstr :: ImportDeclQualifiedStyle -> Constr

dataTypeOf :: ImportDeclQualifiedStyle -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportDeclQualifiedStyle)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportDeclQualifiedStyle)

gmapT :: (forall b. Data b => b -> b) -> ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportDeclQualifiedStyle -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportDeclQualifiedStyle -> r

gmapQ :: (forall d. Data d => d -> u) -> ImportDeclQualifiedStyle -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportDeclQualifiedStyle -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle

Eq ImportDeclQualifiedStyle 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

data ImportListInterpretation #

Constructors

Exactly 
EverythingBut 

Instances

Instances details
Data ImportListInterpretation 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportListInterpretation -> c ImportListInterpretation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportListInterpretation

toConstr :: ImportListInterpretation -> Constr

dataTypeOf :: ImportListInterpretation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportListInterpretation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportListInterpretation)

gmapT :: (forall b. Data b => b -> b) -> ImportListInterpretation -> ImportListInterpretation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportListInterpretation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportListInterpretation -> r

gmapQ :: (forall d. Data d => d -> u) -> ImportListInterpretation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportListInterpretation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation

Eq ImportListInterpretation 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

data IsBootInterface #

Constructors

NotBoot 
IsBoot 

Instances

Instances details
Data IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsBootInterface -> c IsBootInterface

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsBootInterface

toConstr :: IsBootInterface -> Constr

dataTypeOf :: IsBootInterface -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsBootInterface)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsBootInterface)

gmapT :: (forall b. Data b => b -> b) -> IsBootInterface -> IsBootInterface

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r

gmapQ :: (forall d. Data d => d -> u) -> IsBootInterface -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsBootInterface -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface

Show IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

showsPrec :: Int -> IsBootInterface -> ShowS

show :: IsBootInterface -> String

showList :: [IsBootInterface] -> ShowS

Eq IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Ord IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

type LIE pass = XRec pass (IE pass) #

type LImportDecl pass = XRec pass (ImportDecl pass) #

data OverLitVal #

Constructors

HsIntegral !IntegralLit 
HsFractional !FractionalLit 
HsIsString !SourceText !FastString 

Instances

Instances details
Data OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverLitVal -> c OverLitVal

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverLitVal

toConstr :: OverLitVal -> Constr

dataTypeOf :: OverLitVal -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverLitVal)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverLitVal)

gmapT :: (forall b. Data b => b -> b) -> OverLitVal -> OverLitVal

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverLitVal -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverLitVal -> r

gmapQ :: (forall d. Data d => d -> u) -> OverLitVal -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverLitVal -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal

Eq OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: OverLitVal -> OverLitVal -> Bool

(/=) :: OverLitVal -> OverLitVal -> Bool

Ord OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

type family ConLikeP x #

Instances

Instances details
type ConLikeP GhcPs 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcPs = RdrName
type ConLikeP GhcRn 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcTc 
Instance details

Defined in GHC.Hs.Pat

type ConLikeP GhcTc = ConLike

data HsConPatTyArg p #

Constructors

HsConPatTyArg !(LHsToken "@" p) (HsPatSigType p) 

data HsFieldBind lhs rhs #

Constructors

HsFieldBind 

Fields

Instances

Instances details
Foldable (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

fold :: Monoid m => HsFieldBind lhs m -> m

foldMap :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m

foldMap' :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m

foldr :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b

foldr' :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b

foldl :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b

foldl' :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b

foldr1 :: (a -> a -> a) -> HsFieldBind lhs a -> a

foldl1 :: (a -> a -> a) -> HsFieldBind lhs a -> a

toList :: HsFieldBind lhs a -> [a]

null :: HsFieldBind lhs a -> Bool

length :: HsFieldBind lhs a -> Int

elem :: Eq a => a -> HsFieldBind lhs a -> Bool

maximum :: Ord a => HsFieldBind lhs a -> a

minimum :: Ord a => HsFieldBind lhs a -> a

sum :: Num a => HsFieldBind lhs a -> a

product :: Num a => HsFieldBind lhs a -> a

Traversable (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

traverse :: Applicative f => (a -> f b) -> HsFieldBind lhs a -> f (HsFieldBind lhs b)

sequenceA :: Applicative f => HsFieldBind lhs (f a) -> f (HsFieldBind lhs a)

mapM :: Monad m => (a -> m b) -> HsFieldBind lhs a -> m (HsFieldBind lhs b)

sequence :: Monad m => HsFieldBind lhs (m a) -> m (HsFieldBind lhs a)

Functor (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

fmap :: (a -> b) -> HsFieldBind lhs a -> HsFieldBind lhs b

(<$) :: a -> HsFieldBind lhs b -> HsFieldBind lhs a

type Anno (HsFieldBind lhs rhs) 
Instance details

Defined in GHC.Hs.Pat

type Anno (HsFieldBind lhs rhs) = SrcSpanAnnA

type HsRecField p arg = HsFieldBind (LFieldOcc p) arg #

data HsRecFields p arg #

Constructors

HsRecFields 

Fields

type LHsFieldBind p id arg = XRec p (HsFieldBind id arg) #

type LHsRecField p arg = XRec p (HsRecField p arg) #

type LPat p = XRec p (Pat p) #

data Pat p #

Constructors

WildPat (XWildPat p) 
VarPat (XVarPat p) (LIdP p) 
LazyPat (XLazyPat p) (LPat p) 
AsPat (XAsPat p) (LIdP p) !(LHsToken "@" p) (LPat p) 
ParPat (XParPat p) !(LHsToken "(" p) (LPat p) !(LHsToken ")" p) 
BangPat (XBangPat p) (LPat p) 
ListPat (XListPat p) [LPat p] 
TuplePat (XTuplePat p) [LPat p] Boxity 
SumPat (XSumPat p) (LPat p) ConTag SumWidth 
ConPat 
ViewPat (XViewPat p) (LHsExpr p) (LPat p) 
SplicePat (XSplicePat p) (HsUntypedSplice p) 
LitPat (XLitPat p) (HsLit p) 
NPat (XNPat p) (XRec p (HsOverLit p)) (Maybe (SyntaxExpr p)) (SyntaxExpr p) 
NPlusKPat (XNPlusKPat p) (LIdP p) (XRec p (HsOverLit p)) (HsOverLit p) (SyntaxExpr p) (SyntaxExpr p) 
SigPat (XSigPat p) (LPat p) (HsPatSigType (NoGhcTc p)) 
XPat !(XXPat p) 

Instances

Instances details
type Anno (Pat (GhcPass p)) 
Instance details

Defined in GHC.Hs.Pat

newtype RecFieldsDotDot #

Constructors

RecFieldsDotDot 

Fields

Instances

Instances details
Data RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecFieldsDotDot -> c RecFieldsDotDot

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecFieldsDotDot

toConstr :: RecFieldsDotDot -> Constr

dataTypeOf :: RecFieldsDotDot -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecFieldsDotDot)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecFieldsDotDot)

gmapT :: (forall b. Data b => b -> b) -> RecFieldsDotDot -> RecFieldsDotDot

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecFieldsDotDot -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecFieldsDotDot -> r

gmapQ :: (forall d. Data d => d -> u) -> RecFieldsDotDot -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecFieldsDotDot -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot

Eq RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Ord RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

type Anno RecFieldsDotDot 
Instance details

Defined in GHC.Hs.Pat

data AmbiguousFieldOcc pass #

Constructors

Unambiguous (XUnambiguous pass) (XRec pass RdrName) 
Ambiguous (XAmbiguous pass) (XRec pass RdrName) 
XAmbiguousFieldOcc !(XXAmbiguousFieldOcc pass) 

Instances

Instances details
type Anno (AmbiguousFieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type BangType pass = HsType pass #

data ConDeclField pass #

Constructors

ConDeclField 

Fields

XConDeclField !(XXConDeclField pass) 

Instances

Instances details
type Anno (ConDeclField (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

data FieldOcc pass #

Constructors

FieldOcc 

Fields

XFieldOcc !(XXFieldOcc pass) 

Instances

Instances details
(Eq (XRec pass RdrName), Eq (XCFieldOcc pass), Eq (XXFieldOcc pass)) => Eq (FieldOcc pass) 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: FieldOcc pass -> FieldOcc pass -> Bool

(/=) :: FieldOcc pass -> FieldOcc pass -> Bool

type Anno (FieldOcc (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

data HsArg tm ty #

Constructors

HsValArg tm 
HsTypeArg SrcSpan ty 
HsArgPar SrcSpan 

data HsArrow pass #

Constructors

HsUnrestrictedArrow !(LHsUniToken "->" "\8594" pass) 
HsLinearArrow !(HsLinearArrowTokens pass) 
HsExplicitMult !(LHsToken "%" pass) !(LHsType pass) !(LHsUniToken "->" "\8594" pass) 

data HsConDetails tyarg arg rec #

Constructors

PrefixCon [tyarg] [arg] 
RecCon rec 
InfixCon arg arg 

Instances

Instances details
(Data tyarg, Data rec, Data arg) => Data (HsConDetails tyarg arg rec) 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsConDetails tyarg arg rec -> c (HsConDetails tyarg arg rec)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsConDetails tyarg arg rec)

toConstr :: HsConDetails tyarg arg rec -> Constr

dataTypeOf :: HsConDetails tyarg arg rec -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsConDetails tyarg arg rec))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsConDetails tyarg arg rec))

gmapT :: (forall b. Data b => b -> b) -> HsConDetails tyarg arg rec -> HsConDetails tyarg arg rec

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsConDetails tyarg arg rec -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsConDetails tyarg arg rec -> r

gmapQ :: (forall d. Data d => d -> u) -> HsConDetails tyarg arg rec -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsConDetails tyarg arg rec -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec)

type HsContext pass = [LHsType pass] #

newtype HsIPName #

Constructors

HsIPName FastString 

Instances

Instances details
Data HsIPName 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsIPName -> c HsIPName

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsIPName

toConstr :: HsIPName -> Constr

dataTypeOf :: HsIPName -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsIPName)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsIPName)

gmapT :: (forall b. Data b => b -> b) -> HsIPName -> HsIPName

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsIPName -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsIPName -> r

gmapQ :: (forall d. Data d => d -> u) -> HsIPName -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsIPName -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName

Eq HsIPName 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: HsIPName -> HsIPName -> Bool

(/=) :: HsIPName -> HsIPName -> Bool

type Anno HsIPName 
Instance details

Defined in GHC.Hs.Type

type HsKind pass = HsType pass #

data HsLinearArrowTokens pass #

Constructors

HsPct1 !(LHsToken "%1" pass) !(LHsUniToken "->" "\8594" pass) 
HsLolly !(LHsToken "\8888" pass) 

data HsOuterTyVarBndrs flag pass #

Instances

Instances details
type Anno (HsOuterTyVarBndrs _1 (GhcPass _2)) 
Instance details

Defined in GHC.Hs.Type

data HsPatSigType pass #

Constructors

HsPS 

Fields

XHsPatSigType !(XXHsPatSigType pass) 

data HsScaled pass a #

Constructors

HsScaled (HsArrow pass) a 

data HsSigType pass #

Constructors

HsSig 

Fields

XHsSigType !(XXHsSigType pass) 

Instances

Instances details
type Anno (HsSigType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

data HsTupleSort #

Instances

Instances details
Data HsTupleSort 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsTupleSort -> c HsTupleSort

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsTupleSort

toConstr :: HsTupleSort -> Constr

dataTypeOf :: HsTupleSort -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsTupleSort)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsTupleSort)

gmapT :: (forall b. Data b => b -> b) -> HsTupleSort -> HsTupleSort

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsTupleSort -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsTupleSort -> r

gmapQ :: (forall d. Data d => d -> u) -> HsTupleSort -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsTupleSort -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort

data HsTyLit pass #

Constructors

HsNumTy (XNumTy pass) Integer 
HsStrTy (XStrTy pass) FastString 
HsCharTy (XCharTy pass) Char 
XTyLit !(XXTyLit pass) 

data HsTyVarBndr flag pass #

Constructors

UserTyVar (XUserTyVar pass) flag (LIdP pass) 
KindedTyVar (XKindedTyVar pass) flag (LIdP pass) (LHsKind pass) 
XTyVarBndr !(XXTyVarBndr pass) 

Instances

Instances details
type Anno (HsTyVarBndr _flag (GhcPass _1)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag (GhcPass _1)) = SrcSpanAnnA
type Anno (HsTyVarBndr _flag GhcPs) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcRn) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsTyVarBndr _flag GhcTc) 
Instance details

Defined in GHC.Hs.Type

data HsType pass #

Constructors

HsForAllTy 
HsQualTy 

Fields

HsTyVar (XTyVar pass) PromotionFlag (LIdP pass) 
HsAppTy (XAppTy pass) (LHsType pass) (LHsType pass) 
HsAppKindTy (XAppKindTy pass) (LHsType pass) (LHsKind pass) 
HsFunTy (XFunTy pass) (HsArrow pass) (LHsType pass) (LHsType pass) 
HsListTy (XListTy pass) (LHsType pass) 
HsTupleTy (XTupleTy pass) HsTupleSort [LHsType pass] 
HsSumTy (XSumTy pass) [LHsType pass] 
HsOpTy (XOpTy pass) PromotionFlag (LHsType pass) (LIdP pass) (LHsType pass) 
HsParTy (XParTy pass) (LHsType pass) 
HsIParamTy (XIParamTy pass) (XRec pass HsIPName) (LHsType pass) 
HsStarTy (XStarTy pass) Bool 
HsKindSig (XKindSig pass) (LHsType pass) (LHsKind pass) 
HsSpliceTy (XSpliceTy pass) (HsUntypedSplice pass) 
HsDocTy (XDocTy pass) (LHsType pass) (LHsDoc pass) 
HsBangTy (XBangTy pass) HsSrcBang (LHsType pass) 
HsRecTy (XRecTy pass) [LConDeclField pass] 
HsExplicitListTy (XExplicitListTy pass) PromotionFlag [LHsType pass] 
HsExplicitTupleTy (XExplicitTupleTy pass) [LHsType pass] 
HsTyLit (XTyLit pass) (HsTyLit pass) 
HsWildCardTy (XWildCardTy pass) 
XHsType !(XXType pass) 

Instances

Instances details
DisambTD (HsType GhcPs) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (BangType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsKind (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno (HsType (GhcPass p)) 
Instance details

Defined in GHC.Hs.Type

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

data HsWildCardBndrs pass thing #

Constructors

HsWC 

Fields

XHsWildCardBndrs !(XXHsWildCardBndrs pass thing) 

type LAmbiguousFieldOcc pass = XRec pass (AmbiguousFieldOcc pass) #

type LBangType pass = XRec pass (BangType pass) #

type LConDeclField pass = XRec pass (ConDeclField pass) #

type LFieldOcc pass = XRec pass (FieldOcc pass) #

type LHsContext pass = XRec pass (HsContext pass) #

type LHsKind pass = XRec pass (HsKind pass) #

data LHsQTyVars pass #

Constructors

HsQTvs 

Fields

XLHsQTyVars !(XXLHsQTyVars pass) 

type LHsSigType pass = XRec pass (HsSigType pass) #

type LHsSigWcType pass = HsWildCardBndrs pass (LHsSigType pass) #

type LHsTyVarBndr flag pass = XRec pass (HsTyVarBndr flag pass) #

type LHsType pass = XRec pass (HsType pass) #

type LHsTypeArg p = HsArg (LHsType p) (LHsKind p) #

type LHsWcType pass = HsWildCardBndrs pass (LHsType pass) #

data PromotionFlag #

Constructors

NotPromoted 
IsPromoted 

Instances

Instances details
Data PromotionFlag 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PromotionFlag -> c PromotionFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PromotionFlag

toConstr :: PromotionFlag -> Constr

dataTypeOf :: PromotionFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PromotionFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PromotionFlag)

gmapT :: (forall b. Data b => b -> b) -> PromotionFlag -> PromotionFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PromotionFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PromotionFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> PromotionFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PromotionFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag

Eq PromotionFlag 
Instance details

Defined in Language.Haskell.Syntax.Type

data HsModule p #

Constructors

HsModule 

Fields

XModule !(XXModule p) 

data ClsInst #

Constructors

ClsInst 

Fields

Instances

Instances details
Data ClsInst 
Instance details

Defined in GHC.Core.InstEnv

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClsInst -> c ClsInst

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ClsInst

toConstr :: ClsInst -> Constr

dataTypeOf :: ClsInst -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ClsInst)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ClsInst)

gmapT :: (forall b. Data b => b -> b) -> ClsInst -> ClsInst

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClsInst -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClsInst -> r

gmapQ :: (forall d. Data d => d -> u) -> ClsInst -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClsInst -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClsInst -> m ClsInst

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClsInst -> m ClsInst

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClsInst -> m ClsInst

NamedThing ClsInst 
Instance details

Defined in GHC.Core.InstEnv

Outputable ClsInst 
Instance details

Defined in GHC.Core.InstEnv

Methods

ppr :: ClsInst -> SDoc #

type FastStringEnv a = UniqFM FastString a #

data IOEnv env a #

Instances

Instances details
MonadFail (IOEnv m) 
Instance details

Defined in GHC.Data.IOEnv

Methods

fail :: String -> IOEnv m a

MonadFix (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

mfix :: (a -> IOEnv env a) -> IOEnv env a #

MonadIO (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

liftIO :: IO a -> IOEnv env a #

Alternative (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

empty :: IOEnv env a

(<|>) :: IOEnv env a -> IOEnv env a -> IOEnv env a

some :: IOEnv env a -> IOEnv env [a]

many :: IOEnv env a -> IOEnv env [a]

Applicative (IOEnv m) 
Instance details

Defined in GHC.Data.IOEnv

Methods

pure :: a -> IOEnv m a #

(<*>) :: IOEnv m (a -> b) -> IOEnv m a -> IOEnv m b #

liftA2 :: (a -> b -> c) -> IOEnv m a -> IOEnv m b -> IOEnv m c #

(*>) :: IOEnv m a -> IOEnv m b -> IOEnv m b #

(<*) :: IOEnv m a -> IOEnv m b -> IOEnv m a #

Functor (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

fmap :: (a -> b) -> IOEnv env a -> IOEnv env b

(<$) :: a -> IOEnv env b -> IOEnv env a

Monad (IOEnv m) 
Instance details

Defined in GHC.Data.IOEnv

Methods

(>>=) :: IOEnv m a -> (a -> IOEnv m b) -> IOEnv m b

(>>) :: IOEnv m a -> IOEnv m b -> IOEnv m b

return :: a -> IOEnv m a

MonadPlus (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

mzero :: IOEnv env a

mplus :: IOEnv env a -> IOEnv env a -> IOEnv env a

MonadCatch (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

catch :: (HasCallStack, Exception e) => IOEnv env a -> (e -> IOEnv env a) -> IOEnv env a

MonadMask (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

mask :: HasCallStack => ((forall a. IOEnv env a -> IOEnv env a) -> IOEnv env b) -> IOEnv env b

uninterruptibleMask :: HasCallStack => ((forall a. IOEnv env a -> IOEnv env a) -> IOEnv env b) -> IOEnv env b

generalBracket :: HasCallStack => IOEnv env a -> (a -> ExitCase b -> IOEnv env c) -> (a -> IOEnv env b) -> IOEnv env (b, c)

MonadThrow (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

throwM :: (HasCallStack, Exception e) => e -> IOEnv env a

ContainsHooks env => HasHooks (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

getHooks :: IOEnv env Hooks

ContainsDynFlags env => HasDynFlags (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

getDynFlags :: IOEnv env DynFlags

ContainsModule env => HasModule (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

getModule :: IOEnv env Module

ContainsLogger env => HasLogger (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

getLogger :: IOEnv env Logger

data PendingRnSplice #

Instances

Instances details
Outputable PendingRnSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: PendingRnSplice -> SDoc #

data PendingTcSplice #

Instances

Instances details
Outputable PendingTcSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: PendingTcSplice -> SDoc #

newtype ThModFinalizers #

Constructors

ThModFinalizers [ForeignRef (Q ())] 

Instances

Instances details
Data ThModFinalizers 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ThModFinalizers -> c ThModFinalizers

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ThModFinalizers

toConstr :: ThModFinalizers -> Constr

dataTypeOf :: ThModFinalizers -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ThModFinalizers)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ThModFinalizers)

gmapT :: (forall b. Data b => b -> b) -> ThModFinalizers -> ThModFinalizers

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ThModFinalizers -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ThModFinalizers -> r

gmapQ :: (forall d. Data d => d -> u) -> ThModFinalizers -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ThModFinalizers -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ThModFinalizers -> m ThModFinalizers

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ThModFinalizers -> m ThModFinalizers

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ThModFinalizers -> m ThModFinalizers

data TcRnMessage #

Instances

Instances details
Generic TcRnMessage 
Instance details

Defined in GHC.Tc.Errors.Types

Associated Types

type Rep TcRnMessage :: Type -> Type

Methods

from :: TcRnMessage -> Rep TcRnMessage x

to :: Rep TcRnMessage x -> TcRnMessage

type Rep TcRnMessage 
Instance details

Defined in GHC.Tc.Errors.Types

type Rep TcRnMessage = D1 ('MetaData "TcRnMessage" "GHC.Tc.Errors.Types" "ghc" 'False) (((((((C1 ('MetaCons "TcRnUnknownMessage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnknownDiagnostic)) :+: C1 ('MetaCons "TcRnMessageWithInfo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnitState) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TcRnMessageDetailed))) :+: (C1 ('MetaCons "TcRnWithHsDocContext" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 HsDocContext) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TcRnMessage)) :+: (C1 ('MetaCons "TcRnSolverReport" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SolverReportWithCtxt) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DiagnosticReason) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [GhcHint]))) :+: C1 ('MetaCons "TcRnRedundantConstraints" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Id]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SkolemInfoAnon, Bool)))))) :+: ((C1 ('MetaCons "TcRnInaccessibleCode" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Implication) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SolverReportWithCtxt)) :+: (C1 ('MetaCons "TcRnTypeDoesNotHaveFixedRuntimeRep" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FixedRuntimeRepProvenance) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ErrInfo))) :+: C1 ('MetaCons "TcRnImplicitLift" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ErrInfo)))) :+: (C1 ('MetaCons "TcRnUnusedPatternBinds" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsBind GhcRn))) :+: (C1 ('MetaCons "TcRnDodgyImports" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RdrName)) :+: C1 ('MetaCons "TcRnDodgyExports" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)))))) :+: (((C1 ('MetaCons "TcRnMissingImportList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs))) :+: (C1 ('MetaCons "TcRnUnsafeDueToPlugin" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnModMissingRealSrcSpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Module)))) :+: (C1 ('MetaCons "TcRnIdNotExportedFromModuleSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Module)) :+: (C1 ('MetaCons "TcRnIdNotExportedFromLocalSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "TcRnShadowedName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OccName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShadowedNameProvenance))))) :+: ((C1 ('MetaCons "TcRnDuplicateWarningDecls" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LocatedN RdrName)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RdrName)) :+: (C1 ('MetaCons "TcRnSimplifierTooManyIterations" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cts) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 IntWithInf) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WantedConstraints))) :+: C1 ('MetaCons "TcRnIllegalPatSynDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LIdP GhcPs))))) :+: (C1 ('MetaCons "TcRnLinearPatSyn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnEmptyRecordUpdate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnIllegalFieldPunning" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Located RdrName)))))))) :+: ((((C1 ('MetaCons "TcRnIllegalWildcardsInRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RecordFieldPart)) :+: (C1 ('MetaCons "TcRnIllegalWildcardInType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Name)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BadAnonWildcardContext)) :+: C1 ('MetaCons "TcRnDuplicateFieldName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RecordFieldPart) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty RdrName))))) :+: (C1 ('MetaCons "TcRnIllegalViewPattern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Pat GhcPs))) :+: (C1 ('MetaCons "TcRnCharLiteralOutOfRange" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char)) :+: C1 ('MetaCons "TcRnIllegalWildcardsInConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name))))) :+: ((C1 ('MetaCons "TcRnIgnoringAnnotations" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [LAnnDecl GhcRn])) :+: (C1 ('MetaCons "TcRnAnnotationInSafeHaskell" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnInvalidTypeApplication" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LHsWcType GhcRn))))) :+: (C1 ('MetaCons "TcRnTagToEnumMissingValArg" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnTagToEnumUnspecifiedResTy" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "TcRnTagToEnumResTyNotAnEnum" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))))) :+: (((C1 ('MetaCons "TcRnTagToEnumResTyTypeData" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnArrowIfThenElsePredDependsOnResultTy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnIllegalHsBootFileDecl" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "TcRnRecursivePatternSynonym" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LHsBinds GhcRn))) :+: (C1 ('MetaCons "TcRnPartialTypeSigTyVarMismatch" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LHsSigWcType GhcRn)))) :+: C1 ('MetaCons "TcRnPartialTypeSigBadQuantifier" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LHsSigWcType GhcRn))))))) :+: ((C1 ('MetaCons "TcRnMissingSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MissingSignature) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exported) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: (C1 ('MetaCons "TcRnPolymorphicBinderMissingSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "TcRnOverloadedSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TcIdSigInfo)))) :+: (C1 ('MetaCons "TcRnTupleConstraintInst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Class)) :+: (C1 ('MetaCons "TcRnAbstractClassInst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Class)) :+: C1 ('MetaCons "TcRnNoClassInstHead" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)))))))) :+: (((((C1 ('MetaCons "TcRnUserTypeError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnConstraintInKind" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: C1 ('MetaCons "TcRnUnboxedTupleOrSumTypeFuncArg" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnboxedTupleOrSum) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)))) :+: (C1 ('MetaCons "TcRnLinearFuncInKind" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnForAllEscapeError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Kind)) :+: C1 ('MetaCons "TcRnVDQInTermType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Type)))))) :+: ((C1 ('MetaCons "TcRnBadQuantPredHead" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnIllegalTupleConstraint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: C1 ('MetaCons "TcRnNonTypeVarArgInConstraint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)))) :+: (C1 ('MetaCons "TcRnIllegalImplicitParam" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnIllegalConstraintSynonymOfKind" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: C1 ('MetaCons "TcRnIllegalClassInst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TyConFlavour)))))) :+: (((C1 ('MetaCons "TcRnOversaturatedVisibleKindArg" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnBadAssociatedType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: C1 ('MetaCons "TcRnForAllRankErr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Rank) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)))) :+: (C1 ('MetaCons "TcRnMonomorphicBindings" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name])) :+: (C1 ('MetaCons "TcRnOrphanInstance" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClsInst)) :+: C1 ('MetaCons "TcRnFunDepConflict" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnitState) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ClsInst)))))) :+: ((C1 ('MetaCons "TcRnDupInstanceDecls" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnitState) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ClsInst))) :+: (C1 ('MetaCons "TcRnConflictingFamInstDecls" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty FamInst))) :+: C1 ('MetaCons "TcRnFamInstNotInjective" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InjectivityErrReason) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty CoAxBranch)))))) :+: (C1 ('MetaCons "TcRnBangOnUnliftedType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnLazyBangOnUnliftedType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: C1 ('MetaCons "TcRnMultipleDefaultDeclarations" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [LDefaultDecl GhcRn]))))))) :+: ((((C1 ('MetaCons "TcRnBadDefaultType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Class])) :+: (C1 ('MetaCons "TcRnPatSynBundledWithNonDataCon" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnPatSynBundledWithWrongType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: (C1 ('MetaCons "TcRnDupeModuleExport" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: (C1 ('MetaCons "TcRnExportedModNotImported" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: C1 ('MetaCons "TcRnNullExportedModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName))))) :+: ((C1 ('MetaCons "TcRnMissingExportList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: (C1 ('MetaCons "TcRnExportHiddenComponents" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs))) :+: C1 ('MetaCons "TcRnDuplicateExport" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GreName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs)))))) :+: (C1 ('MetaCons "TcRnExportedParentChildMismatch" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyThing)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GreName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]))) :+: (C1 ('MetaCons "TcRnConflictingExports" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OccName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GreName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GlobalRdrElt))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GreName)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GlobalRdrElt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IE GhcPs))))) :+: C1 ('MetaCons "TcRnAmbiguousField" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsExpr GhcRn)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon)))))) :+: (((C1 ('MetaCons "TcRnMissingFields" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConLike) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FieldLabelString, TcType)])) :+: (C1 ('MetaCons "TcRnFieldUpdateInvalidType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FieldLabelString, TcType)])) :+: C1 ('MetaCons "TcRnNoConstructorHasAllFields" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldLabelString])))) :+: (C1 ('MetaCons "TcRnMixedSelectors" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Id])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Id]))) :+: (C1 ('MetaCons "TcRnMissingStrictFields" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConLike) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FieldLabelString, TcType)])) :+: C1 ('MetaCons "TcRnNoPossibleParentForFields" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [LHsRecUpdField GhcRn]))))) :+: ((C1 ('MetaCons "TcRnBadOverloadedRecordUpdate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [LHsRecUpdField GhcRn])) :+: (C1 ('MetaCons "TcRnStaticFormNotClosed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NotClosedReason)) :+: C1 ('MetaCons "TcRnSpecialClassInst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Class) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)))) :+: (C1 ('MetaCons "TcRnUselessTypeable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnDerivingDefaults" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Class)) :+: C1 ('MetaCons "TcRnNonUnaryTypeclassConstraint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LHsSigType GhcRn)))))))))) :+: ((((((C1 ('MetaCons "TcRnPartialTypeSignatures" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SuggestPartialTypeSignatures) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ThetaType)) :+: C1 ('MetaCons "TcRnCannotDeriveInstance" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Class) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (DerivStrategy GhcTc))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UsingGeneralizedNewtypeDeriving) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DeriveInstanceErrReason))))) :+: (C1 ('MetaCons "TcRnLazyGADTPattern" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnArrowProcGADTPattern" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnForallIdentifier" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RdrName))))) :+: ((C1 ('MetaCons "TcRnTypeEqualityOutOfScope" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnTypeEqualityRequiresOperators" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnIllegalTypeOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SDoc) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RdrName)))) :+: (C1 ('MetaCons "TcRnIllegalTypeOperatorDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RdrName)) :+: (C1 ('MetaCons "TcRnGADTMonoLocalBinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnNotInScope" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NotInScopeError) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RdrName)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ImportError]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [GhcHint]))))))) :+: (((C1 ('MetaCons "TcRnUntickedPromotedThing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UntickedPromotedThing)) :+: (C1 ('MetaCons "TcRnIllegalBuiltinSyntax" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SDoc) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RdrName)) :+: C1 ('MetaCons "TcRnWarnDefaulting" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ct]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TyVar)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))) :+: (C1 ('MetaCons "TcRnIncorrectNameSpace" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :+: (C1 ('MetaCons "TcRnForeignImportPrimExtNotSet" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ForeignImport GhcRn))) :+: C1 ('MetaCons "TcRnForeignImportPrimSafeAnn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ForeignImport GhcRn)))))) :+: ((C1 ('MetaCons "TcRnForeignFunctionImportAsValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ForeignImport GhcRn))) :+: (C1 ('MetaCons "TcRnFunPtrImportWithoutAmpersand" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ForeignImport GhcRn))) :+: C1 ('MetaCons "TcRnIllegalForeignDeclBackend" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either (ForeignExport GhcRn) (ForeignImport GhcRn))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Backend) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExpectedBackends))))) :+: (C1 ('MetaCons "TcRnUnsupportedCallConv" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either (ForeignExport GhcRn) (ForeignImport GhcRn))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnsupportedCallConvention)) :+: (C1 ('MetaCons "TcRnIllegalForeignType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe ArgOrResult)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 IllegalForeignTypeReason)) :+: C1 ('MetaCons "TcRnInvalidCIdentifier" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CLabelString))))))) :+: ((((C1 ('MetaCons "TcRnExpectedValueId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TcTyThing)) :+: (C1 ('MetaCons "TcRnNotARecordSelector" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: C1 ('MetaCons "TcRnRecSelectorEscapedTyVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 OccName)))) :+: (C1 ('MetaCons "TcRnPatSynNotBidirectional" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: (C1 ('MetaCons "TcRnSplicePolymorphicLocalVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Id)) :+: C1 ('MetaCons "TcRnIllegalDerivingItem" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LHsSigType GhcRn)))))) :+: ((C1 ('MetaCons "TcRnUnexpectedAnnotation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HsType GhcRn)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 HsSrcBang)) :+: (C1 ('MetaCons "TcRnIllegalRecordSyntax" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HsType GhcRn))) :+: C1 ('MetaCons "TcRnUnexpectedTypeSplice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HsType GhcRn))))) :+: (C1 ('MetaCons "TcRnInvalidVisibleKindArgument" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LHsType GhcRn)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnTooManyBinders" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Kind) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [LHsTyVarBndr () GhcRn])) :+: C1 ('MetaCons "TcRnDifferentNamesForTyVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)))))) :+: (((C1 ('MetaCons "TcRnDisconnectedTyVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: (C1 ('MetaCons "TcRnInvalidReturnKind" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DataSort) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 AllowedDataResKind)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Kind) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SuggestUnliftedTypes)))) :+: C1 ('MetaCons "TcRnClassKindNotConstraint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Kind)))) :+: (C1 ('MetaCons "TcRnUnpromotableThing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PromotionErr)) :+: (C1 ('MetaCons "TcRnMatchesHaveDiffNumArgs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HsMatchContext GhcTc)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 MatchArgBadMatches)) :+: C1 ('MetaCons "TcRnCannotBindScopedTyVarInPatSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonEmpty (Name, TcTyVar))))))) :+: ((C1 ('MetaCons "TcRnCannotBindTyVarsInPatBind" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonEmpty (Name, TcTyVar)))) :+: (C1 ('MetaCons "TcRnTooManyTyArgsInConPattern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ConLike) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int))) :+: C1 ('MetaCons "TcRnMultipleInlinePragmas" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Id) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LocatedA InlinePragma)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonEmpty (LocatedA InlinePragma))))))) :+: (C1 ('MetaCons "TcRnUnexpectedPragmas" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Id) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonEmpty (LSig GhcRn)))) :+: (C1 ('MetaCons "TcRnNonOverloadedSpecialisePragma" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LIdP GhcRn))) :+: C1 ('MetaCons "TcRnSpecialiseNotVisible" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)))))))) :+: (((((C1 ('MetaCons "TcRnNameByTemplateHaskellQuote" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RdrName)) :+: (C1 ('MetaCons "TcRnIllegalBindingOfBuiltIn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 OccName)) :+: C1 ('MetaCons "TcRnPragmaWarning" 'PrefixI 'True) ((S1 ('MetaSel ('Just "pragma_warning_occ") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OccName) :*: S1 ('MetaSel ('Just "pragma_warning_msg") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (WarningTxt GhcRn))) :*: (S1 ('MetaSel ('Just "pragma_warning_import_mod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: S1 ('MetaSel ('Just "pragma_warning_defined_mod") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName))))) :+: (C1 ('MetaCons "TcRnIllegalHsigDefaultMethods" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (LHsBind GhcRn)))) :+: (C1 ('MetaCons "TcRnBadGenericMethod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: C1 ('MetaCons "TcRnWarningMinimalDefIncomplete" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassMinimalDef))))) :+: ((C1 ('MetaCons "TcRnDefaultMethodForPragmaLacksBinding" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Id) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Sig GhcRn))) :+: (C1 ('MetaCons "TcRnIgnoreSpecialisePragmaOnDefMethod" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: C1 ('MetaCons "TcRnBadMethodErr" 'PrefixI 'True) (S1 ('MetaSel ('Just "badMethodErrClassName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Just "badMethodErrMethodName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)))) :+: (C1 ('MetaCons "TcRnNoExplicitAssocTypeOrDefaultDeclaration" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: (C1 ('MetaCons "TcRnIllegalNewtype" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DataCon) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IllegalNewtypeReason))) :+: C1 ('MetaCons "TcRnIllegalTypeData" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "TcRnTypeDataForbids" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeDataForbids)) :+: (C1 ('MetaCons "TcRnTypedTHWithPolyType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TcType)) :+: C1 ('MetaCons "TcRnSpliceThrewException" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SplicePhase) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SomeException)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (LHsExpr GhcTc)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)))))) :+: (C1 ('MetaCons "TcRnInvalidTopDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HsDecl GhcPs))) :+: (C1 ('MetaCons "TcRnNonExactName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RdrName)) :+: C1 ('MetaCons "TcRnAddInvalidCorePlugin" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String))))) :+: ((C1 ('MetaCons "TcRnAddDocToNonLocalDefn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DocLoc)) :+: (C1 ('MetaCons "TcRnFailedToLookupThInstName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LookupTHInstNameErrReason)) :+: C1 ('MetaCons "TcRnCannotReifyInstance" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)))) :+: (C1 ('MetaCons "TcRnCannotReifyOutOfScopeThing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: (C1 ('MetaCons "TcRnCannotReifyThingNotInTypeEnv" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name)) :+: C1 ('MetaCons "TcRnNoRolesAssociatedWithThing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TcTyThing))))))) :+: ((((C1 ('MetaCons "TcRnCannotRepresentType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnrepresentableTypeDescr) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type)) :+: (C1 ('MetaCons "TcRnRunSpliceFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RunSpliceFailReason)) :+: C1 ('MetaCons "TcRnReportCustomQuasiError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)))) :+: (C1 ('MetaCons "TcRnInterfaceLookupError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SDoc)) :+: (C1 ('MetaCons "TcRnUnsatisfiedMinimalDef" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassMinimalDef)) :+: C1 ('MetaCons "TcRnMisplacedInstSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LHsSigType GhcRn)))))) :+: ((C1 ('MetaCons "TcRnBadBootFamInstDecl" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnIllegalFamilyInstance" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon)) :+: C1 ('MetaCons "TcRnMissingClassAssoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon)))) :+: (C1 ('MetaCons "TcRnBadFamInstDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon)) :+: (C1 ('MetaCons "TcRnNotOpenFamily" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyCon)) :+: C1 ('MetaCons "TcRnNoRebindableSyntaxRecordDot" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "TcRnNoFieldPunsRecordDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TcRnIllegalStaticExpression" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsExpr GhcPs))) :+: C1 ('MetaCons "TcRnIllegalStaticFormInSplice" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsExpr GhcPs))))) :+: (C1 ('MetaCons "TcRnListComprehensionDuplicateBinding" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: (C1 ('MetaCons "TcRnEmptyStmtsGroup" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EmptyStatementGroupErrReason)) :+: C1 ('MetaCons "TcRnLastStmtNotExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsStmtContext GhcRn)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnexpectedStatement))))) :+: ((C1 ('MetaCons "TcRnUnexpectedStatementInContext" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsStmtContext GhcRn)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnexpectedStatement) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Extension)))) :+: (C1 ('MetaCons "TcRnIllegalTupleSection" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TcRnIllegalImplicitParameterBindings" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either (HsLocalBindsLR GhcPs GhcPs) (HsLocalBindsLR GhcRn GhcPs)))))) :+: (C1 ('MetaCons "TcRnSectionWithoutParentheses" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HsExpr GhcPs))) :+: (C1 ('MetaCons "TcRnLoopySuperclassSolve" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CtLoc) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PredType)) :+: C1 ('MetaCons "TcRnCannotDefaultConcrete" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FixedRuntimeRepOrigin))))))))))
type DiagnosticOpts TcRnMessage 
Instance details

Defined in GHC.Tc.Errors.Ppr

type DiagnosticOpts TcRnMessage = TcRnMessageOpts

data Ct #

Instances

Instances details
Outputable Ct 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Ct -> SDoc #

data CtFlavour #

Constructors

Given 
Wanted 

Instances

Instances details
Outputable CtFlavour 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CtFlavour -> SDoc #

Eq CtFlavour 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: CtFlavour -> CtFlavour -> Bool

(/=) :: CtFlavour -> CtFlavour -> Bool

data CtLoc #

newtype RewriterSet #

Instances

Instances details
Monoid RewriterSet 
Instance details

Defined in GHC.Tc.Types.Constraint

Semigroup RewriterSet 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(<>) :: RewriterSet -> RewriterSet -> RewriterSet

sconcat :: NonEmpty RewriterSet -> RewriterSet

stimes :: Integral b => b -> RewriterSet -> RewriterSet

Outputable RewriterSet 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: RewriterSet -> SDoc #

data WantedConstraints #

Constructors

WC 

Instances

Instances details
Outputable WantedConstraints 
Instance details

Defined in GHC.Tc.Types.Constraint

data EvBind #

Constructors

EvBind 

Fields

Instances

Instances details
Outputable EvBind 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBind -> SDoc #

data EvBindsVar #

Constructors

EvBindsVar 

Fields

CoEvBindsVar 

Fields

Instances

Instances details
Uniquable EvBindsVar 
Instance details

Defined in GHC.Tc.Types.Evidence

Outputable EvBindsVar 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBindsVar -> SDoc #

data EvTerm #

Constructors

EvExpr EvExpr 
EvTypeable Type EvTypeable 
EvFun 

Fields

Instances

Instances details
Data EvTerm 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EvTerm -> c EvTerm

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EvTerm

toConstr :: EvTerm -> Constr

dataTypeOf :: EvTerm -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EvTerm)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EvTerm)

gmapT :: (forall b. Data b => b -> b) -> EvTerm -> EvTerm

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EvTerm -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EvTerm -> r

gmapQ :: (forall d. Data d => d -> u) -> EvTerm -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EvTerm -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EvTerm -> m EvTerm

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EvTerm -> m EvTerm

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EvTerm -> m EvTerm

Outputable EvTerm 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvTerm -> SDoc #

data QuoteWrapper #

Constructors

QuoteWrapper EvVar Type 

Instances

Instances details
Data QuoteWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuoteWrapper -> c QuoteWrapper

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuoteWrapper

toConstr :: QuoteWrapper -> Constr

dataTypeOf :: QuoteWrapper -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuoteWrapper)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuoteWrapper)

gmapT :: (forall b. Data b => b -> b) -> QuoteWrapper -> QuoteWrapper

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuoteWrapper -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuoteWrapper -> r

gmapQ :: (forall d. Data d => d -> u) -> QuoteWrapper -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> QuoteWrapper -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuoteWrapper -> m QuoteWrapper

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteWrapper -> m QuoteWrapper

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteWrapper -> m QuoteWrapper

data CtOrigin #

Constructors

GivenOrigin SkolemInfoAnon 
GivenSCOrigin SkolemInfoAnon ScDepth Bool 
OccurrenceOf Name 
OccurrenceOfRecSel RdrName 
AppOrigin 
SpecPragOrigin UserTypeCtxt 
TypeEqOrigin 

Fields

KindEqOrigin TcType TcType CtOrigin (Maybe TypeOrKind) 
IPOccOrigin HsIPName 
OverLabelOrigin FastString 
LiteralOrigin (HsOverLit GhcRn) 
NegateOrigin 
ArithSeqOrigin (ArithSeqInfo GhcRn) 
AssocFamPatOrigin 
SectionOrigin 
HasFieldOrigin FastString 
TupleOrigin 
ExprSigOrigin 
PatSigOrigin 
PatOrigin 
ProvCtxtOrigin (PatSynBind GhcRn GhcRn) 
RecordUpdOrigin 
ViewPatOrigin 
ScOrigin ClsInstOrQC NakedScFlag 
DerivClauseOrigin 
DerivOriginDC DataCon Int Bool 
DerivOriginCoerce Id Type Type Bool 
StandAloneDerivOrigin 
DefaultOrigin 
DoOrigin 
DoPatOrigin (LPat GhcRn) 
MCompOrigin 
MCompPatOrigin (LPat GhcRn) 
ProcOrigin 
ArrowCmdOrigin 
AnnOrigin 
FunDepOrigin1 PredType CtOrigin RealSrcSpan PredType CtOrigin RealSrcSpan 
FunDepOrigin2 PredType CtOrigin PredType SrcSpan 
InjTFOrigin1 PredType CtOrigin RealSrcSpan PredType CtOrigin RealSrcSpan 
ExprHoleOrigin (Maybe RdrName) 
TypeHoleOrigin OccName 
PatCheckOrigin 
ListOrigin 
IfThenElseOrigin 
BracketOrigin 
StaticOrigin 
Shouldn'tHappenOrigin String 
GhcBug20076 
InstProvidedOrigin Module ClsInst 
NonLinearPatternOrigin 
UsageEnvironmentOf Name 
CycleBreakerOrigin CtOrigin 
FRROrigin FixedRuntimeRepOrigin 
WantedSuperclassOrigin PredType CtOrigin 
InstanceSigOrigin Name Type Type 
AmbiguityCheckOrigin UserTypeCtxt 

Instances

Instances details
Outputable CtOrigin 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: CtOrigin -> SDoc #

data ExpType #

Constructors

Check TcType 
Infer !InferResult 

Instances

Instances details
Outputable ExpType 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: ExpType -> SDoc #

newtype TcLevel #

Constructors

TcLevel Int 

Instances

Instances details
Outputable TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: TcLevel -> SDoc #

Eq TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

(==) :: TcLevel -> TcLevel -> Bool

(/=) :: TcLevel -> TcLevel -> Bool

Ord TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

compare :: TcLevel -> TcLevel -> Ordering

(<) :: TcLevel -> TcLevel -> Bool

(<=) :: TcLevel -> TcLevel -> Bool

(>) :: TcLevel -> TcLevel -> Bool

(>=) :: TcLevel -> TcLevel -> Bool

max :: TcLevel -> TcLevel -> TcLevel

min :: TcLevel -> TcLevel -> TcLevel

data TopLevelFlag #

Constructors

TopLevel 
NotTopLevel 

Instances

Instances details
Data TopLevelFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TopLevelFlag -> c TopLevelFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TopLevelFlag

toConstr :: TopLevelFlag -> Constr

dataTypeOf :: TopLevelFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TopLevelFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TopLevelFlag)

gmapT :: (forall b. Data b => b -> b) -> TopLevelFlag -> TopLevelFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> TopLevelFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TopLevelFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag

Outputable TopLevelFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TopLevelFlag -> SDoc #

data CompleteMatch #

Instances

Instances details
Outputable CompleteMatch 
Instance details

Defined in GHC.Types.CompleteMatch

Methods

ppr :: CompleteMatch -> SDoc #

type NameEnv a = UniqFM Name a #

class HasOccName name where #

Methods

occName :: name -> OccName #

Instances

Instances details
HasOccName IfaceClassOp 
Instance details

Defined in GHC.Iface.Syntax

Methods

occName :: IfaceClassOp -> OccName #

HasOccName IfaceConDecl 
Instance details

Defined in GHC.Iface.Syntax

Methods

occName :: IfaceConDecl -> OccName #

HasOccName IfaceDecl 
Instance details

Defined in GHC.Iface.Syntax

Methods

occName :: IfaceDecl -> OccName #

HasOccName HoleFitCandidate 
Instance details

Defined in GHC.Tc.Errors.Hole.FitTypes

Methods

occName :: HoleFitCandidate -> OccName #

HasOccName TcBinder 
Instance details

Defined in GHC.Tc.Types

Methods

occName :: TcBinder -> OccName #

HasOccName GreName 
Instance details

Defined in GHC.Types.Avail

Methods

occName :: GreName -> OccName #

HasOccName FieldLabel 
Instance details

Defined in GHC.Types.FieldLabel

Methods

occName :: FieldLabel -> OccName #

HasOccName Name 
Instance details

Defined in GHC.Types.Name

Methods

occName :: Name -> OccName #

HasOccName OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

occName :: OccName -> OccName #

HasOccName GlobalRdrElt 
Instance details

Defined in GHC.Types.Name.Reader

Methods

occName :: GlobalRdrElt -> OccName #

HasOccName RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

occName :: RdrName -> OccName #

HasOccName Var 
Instance details

Defined in GHC.Types.Var

Methods

occName :: Var -> OccName #

data OccEnv a #

Instances

Instances details
Data a => Data (OccEnv a) 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OccEnv a -> c (OccEnv a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (OccEnv a)

toConstr :: OccEnv a -> Constr

dataTypeOf :: OccEnv a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (OccEnv a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (OccEnv a))

gmapT :: (forall b. Data b => b -> b) -> OccEnv a -> OccEnv a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OccEnv a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OccEnv a -> r

gmapQ :: (forall d. Data d => d -> u) -> OccEnv a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> OccEnv a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OccEnv a -> m (OccEnv a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OccEnv a -> m (OccEnv a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OccEnv a -> m (OccEnv a)

NFData a => NFData (OccEnv a) 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

rnf :: OccEnv a -> ()

Outputable a => Outputable (OccEnv a) 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

ppr :: OccEnv a -> SDoc #

data RealSrcSpan #

Instances

Instances details
Data RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RealSrcSpan -> c RealSrcSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RealSrcSpan

toConstr :: RealSrcSpan -> Constr

dataTypeOf :: RealSrcSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RealSrcSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RealSrcSpan)

gmapT :: (forall b. Data b => b -> b) -> RealSrcSpan -> RealSrcSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RealSrcSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RealSrcSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> RealSrcSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RealSrcSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan

Show RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> RealSrcSpan -> ShowS

show :: RealSrcSpan -> String

showList :: [RealSrcSpan] -> ShowS

ToJson RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

json :: RealSrcSpan -> JsonDoc

Outputable RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: RealSrcSpan -> SDoc #

Eq RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: RealSrcSpan -> RealSrcSpan -> Bool

(/=) :: RealSrcSpan -> RealSrcSpan -> Bool

Ord RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Outputable e => Outputable (GenLocated RealSrcSpan e) 
Instance details

Defined in GHC.Types.SrcLoc

data SrcSpan #

Instances

Instances details
Data SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpan -> c SrcSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcSpan

toConstr :: SrcSpan -> Constr

dataTypeOf :: SrcSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcSpan)

gmapT :: (forall b. Data b => b -> b) -> SrcSpan -> SrcSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> SrcSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan

Show SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> SrcSpan -> ShowS

show :: SrcSpan -> String

showList :: [SrcSpan] -> ShowS

NFData SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

rnf :: SrcSpan -> ()

ToJson SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

json :: SrcSpan -> JsonDoc

Outputable SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: SrcSpan -> SDoc #

Eq SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcSpan -> SrcSpan -> Bool

(/=) :: SrcSpan -> SrcSpan -> Bool

NamedThing e => NamedThing (Located e) 
Instance details

Defined in GHC.Types.Name

Outputable e => Outputable (Located e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: Located e -> SDoc #

type TcTyVar = Var #

type TyVar = Var #

data ImportAvails #

Constructors

ImportAvails 

data TcPluginM a #

Instances

Instances details
MonadFail TcPluginM 
Instance details

Defined in GHC.Tc.Types

Methods

fail :: String -> TcPluginM a

Applicative TcPluginM 
Instance details

Defined in GHC.Tc.Types

Methods

pure :: a -> TcPluginM a #

(<*>) :: TcPluginM (a -> b) -> TcPluginM a -> TcPluginM b #

liftA2 :: (a -> b -> c) -> TcPluginM a -> TcPluginM b -> TcPluginM c #

(*>) :: TcPluginM a -> TcPluginM b -> TcPluginM b #

(<*) :: TcPluginM a -> TcPluginM b -> TcPluginM a #

Functor TcPluginM 
Instance details

Defined in GHC.Tc.Types

Methods

fmap :: (a -> b) -> TcPluginM a -> TcPluginM b

(<$) :: a -> TcPluginM b -> TcPluginM a

Monad TcPluginM 
Instance details

Defined in GHC.Tc.Types

Methods

(>>=) :: TcPluginM a -> (a -> TcPluginM b) -> TcPluginM b

(>>) :: TcPluginM a -> TcPluginM b -> TcPluginM b

return :: a -> TcPluginM a

data DocLoc #

Instances

Instances details
Eq DocLoc 
Instance details

Defined in GHC.Tc.Types

Methods

(==) :: DocLoc -> DocLoc -> Bool

(/=) :: DocLoc -> DocLoc -> Bool

Ord DocLoc 
Instance details

Defined in GHC.Tc.Types

Methods

compare :: DocLoc -> DocLoc -> Ordering

(<) :: DocLoc -> DocLoc -> Bool

(<=) :: DocLoc -> DocLoc -> Bool

(>) :: DocLoc -> DocLoc -> Bool

(>=) :: DocLoc -> DocLoc -> Bool

max :: DocLoc -> DocLoc -> DocLoc

min :: DocLoc -> DocLoc -> DocLoc

data TcBinder #

Instances

Instances details
HasOccName TcBinder 
Instance details

Defined in GHC.Tc.Types

Methods

occName :: TcBinder -> OccName #

Outputable TcBinder 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcBinder -> SDoc #

data DefaultingProposal #

Instances

Instances details
Outputable DefaultingProposal 
Instance details

Defined in GHC.Tc.Types

data IdBindingInfo #

Instances

Instances details
Outputable IdBindingInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: IdBindingInfo -> SDoc #

data TcIdSigInfo #

Instances

Instances details
Outputable TcIdSigInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcIdSigInfo -> SDoc #

data TcIdSigInst #

Instances

Instances details
Outputable TcIdSigInst 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcIdSigInst -> SDoc #

data TcPatSynInfo #

Constructors

TPSI 

Fields

Instances

Instances details
Outputable TcPatSynInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcPatSynInfo -> SDoc #

data TcSigInfo #

Instances

Instances details
Outputable TcSigInfo 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcSigInfo -> SDoc #

data TcTyThing #

Instances

Instances details
Outputable TcTyThing 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: TcTyThing -> SDoc #

data ThStage #

Constructors

Splice SpliceType 
RunSplice (TcRef [ForeignRef (Q ())]) 
Comp 
Brack ThStage PendingStuff 

Instances

Instances details
Outputable ThStage 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: ThStage -> SDoc #

data WhereFrom #

Instances

Instances details
Outputable WhereFrom 
Instance details

Defined in GHC.Tc.Types

Methods

ppr :: WhereFrom -> SDoc #

data ArrowCtxt #

Constructors

NoArrowCtxt 
ArrowCtxt LocalRdrEnv (TcRef WantedConstraints) 

type ClosedTypeId = Bool #

type ErrCtxt = (Bool, TidyEnv -> TcM (TidyEnv, SDoc)) #

type IfG = IfM () #

type IfL = IfM IfLclEnv #

data NameShape #

Constructors

NameShape 

Fields

type RecFieldEnv = NameEnv [FieldLabel] #

data RewriteEnv #

Constructors

RE 

type RhsNames = NameSet #

type RnM = TcRn #

data SelfBootInfo #

Constructors

NoSelfBoot 
SelfBoot 

Fields

data SpliceType #

Constructors

Typed 
Untyped 

type THDocs = Map DocLoc (HsDoc GhcRn) #

type TcId = Id #

type TcIdSet = IdSet #

type TcRef a = IORef a #

type TcRnIf a b = IOEnv (Env a b) #

type TcSigFun = Name -> Maybe TcSigInfo #

type ThLevel = Int #

data ForeignSrcLang #

Instances

Instances details
Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: Type -> Type

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Methods

showsPrec :: Int -> ForeignSrcLang -> ShowS

show :: ForeignSrcLang -> String

showList :: [ForeignSrcLang] -> ShowS

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

type Rep ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

type Rep ForeignSrcLang = D1 ('MetaData "ForeignSrcLang" "GHC.ForeignSrcLang.Type" "ghc-boot-th-9.6.6" 'False) ((C1 ('MetaCons "LangC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LangCxx" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LangObjc" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LangObjcxx" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LangAsm" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LangJs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RawObject" 'PrefixI 'False) (U1 :: Type -> Type))))

data OccName #

Instances

Instances details
Data OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OccName -> c OccName

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OccName

toConstr :: OccName -> Constr

dataTypeOf :: OccName -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OccName)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OccName)

gmapT :: (forall b. Data b => b -> b) -> OccName -> OccName

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r

gmapQ :: (forall d. Data d => d -> u) -> OccName -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> OccName -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OccName -> m OccName

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName

NFData OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

rnf :: OccName -> ()

HasOccName OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

occName :: OccName -> OccName #

Uniquable OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

getUnique :: OccName -> Unique #

Binary OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

put_ :: BinHandle -> OccName -> IO ()

put :: BinHandle -> OccName -> IO (Bin OccName)

get :: BinHandle -> IO OccName

Outputable OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

ppr :: OccName -> SDoc #

OutputableBndr OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Eq OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

(==) :: OccName -> OccName -> Bool

(/=) :: OccName -> OccName -> Bool

Ord OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

compare :: OccName -> OccName -> Ordering

(<) :: OccName -> OccName -> Bool

(<=) :: OccName -> OccName -> Bool

(>) :: OccName -> OccName -> Bool

(>=) :: OccName -> OccName -> Bool

max :: OccName -> OccName -> OccName

min :: OccName -> OccName -> OccName

data GenWithIsBoot mod #

Constructors

GWIB 

Instances

Instances details
Foldable GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

fold :: Monoid m => GenWithIsBoot m -> m

foldMap :: Monoid m => (a -> m) -> GenWithIsBoot a -> m

foldMap' :: Monoid m => (a -> m) -> GenWithIsBoot a -> m

foldr :: (a -> b -> b) -> b -> GenWithIsBoot a -> b

foldr' :: (a -> b -> b) -> b -> GenWithIsBoot a -> b

foldl :: (b -> a -> b) -> b -> GenWithIsBoot a -> b

foldl' :: (b -> a -> b) -> b -> GenWithIsBoot a -> b

foldr1 :: (a -> a -> a) -> GenWithIsBoot a -> a

foldl1 :: (a -> a -> a) -> GenWithIsBoot a -> a

toList :: GenWithIsBoot a -> [a]

null :: GenWithIsBoot a -> Bool

length :: GenWithIsBoot a -> Int

elem :: Eq a => a -> GenWithIsBoot a -> Bool

maximum :: Ord a => GenWithIsBoot a -> a

minimum :: Ord a => GenWithIsBoot a -> a

sum :: Num a => GenWithIsBoot a -> a

product :: Num a => GenWithIsBoot a -> a

Traversable GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

traverse :: Applicative f => (a -> f b) -> GenWithIsBoot a -> f (GenWithIsBoot b)

sequenceA :: Applicative f => GenWithIsBoot (f a) -> f (GenWithIsBoot a)

mapM :: Monad m => (a -> m b) -> GenWithIsBoot a -> m (GenWithIsBoot b)

sequence :: Monad m => GenWithIsBoot (m a) -> m (GenWithIsBoot a)

Functor GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenWithIsBoot a -> GenWithIsBoot b

(<$) :: a -> GenWithIsBoot b -> GenWithIsBoot a

Show mod => Show (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> GenWithIsBoot mod -> ShowS

show :: GenWithIsBoot mod -> String

showList :: [GenWithIsBoot mod] -> ShowS

Binary a => Binary (GenWithIsBoot a) 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> GenWithIsBoot a -> IO ()

put :: BinHandle -> GenWithIsBoot a -> IO (Bin (GenWithIsBoot a))

get :: BinHandle -> IO (GenWithIsBoot a)

Outputable a => Outputable (GenWithIsBoot a) 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: GenWithIsBoot a -> SDoc #

Eq mod => Eq (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

(/=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

Ord mod => Ord (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: GenWithIsBoot mod -> GenWithIsBoot mod -> Ordering

(<) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

(<=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

(>) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

(>=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool

max :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod

min :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod

data GenUnit uid #

Constructors

RealUnit !(Definite uid) 
VirtUnit !(GenInstantiatedUnit uid) 
HoleUnit 

Instances

Instances details
Data Unit 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unit -> c Unit

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Unit

toConstr :: Unit -> Constr

dataTypeOf :: Unit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Unit)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Unit)

gmapT :: (forall b. Data b => b -> b) -> Unit -> Unit

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r

gmapQ :: (forall d. Data d => d -> u) -> Unit -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unit -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unit -> m Unit

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit

Show Unit 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> Unit -> ShowS

show :: Unit -> String

showList :: [Unit] -> ShowS

NFData Unit 
Instance details

Defined in GHC.Unit.Types

Methods

rnf :: Unit -> ()

Uniquable Module 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Module -> Unique #

Binary Unit 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> Unit -> IO ()

put :: BinHandle -> Unit -> IO (Bin Unit)

get :: BinHandle -> IO Unit

Outputable Module 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Module -> SDoc #

Outputable Unit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Unit -> SDoc #

Ord Unit 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: Unit -> Unit -> Ordering

(<) :: Unit -> Unit -> Bool

(<=) :: Unit -> Unit -> Bool

(>) :: Unit -> Unit -> Bool

(>=) :: Unit -> Unit -> Bool

max :: Unit -> Unit -> Unit

min :: Unit -> Unit -> Unit

IsUnitId u => Uniquable (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: GenUnit u -> Unique #

IsUnitId u => IsUnitId (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: GenUnit u -> FastString #

IsUnitId u => Eq (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenUnit u -> GenUnit u -> Bool

(/=) :: GenUnit u -> GenUnit u -> Bool

type TcTyCon = TyCon #

data CoercionHole #

Constructors

CoercionHole 

Fields

Instances

Instances details
Data CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CoercionHole -> c CoercionHole

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CoercionHole

toConstr :: CoercionHole -> Constr

dataTypeOf :: CoercionHole -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CoercionHole)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CoercionHole)

gmapT :: (forall b. Data b => b -> b) -> CoercionHole -> CoercionHole

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CoercionHole -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CoercionHole -> r

gmapQ :: (forall d. Data d => d -> u) -> CoercionHole -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> CoercionHole -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CoercionHole -> m CoercionHole

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CoercionHole -> m CoercionHole

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CoercionHole -> m CoercionHole

Uniquable CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Outputable CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: CoercionHole -> SDoc #

type Kind = Type #

type PredType = Type #

data CtEvidence #

Instances

Instances details
Outputable CtEvidence 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CtEvidence -> SDoc #

type EvExpr = CoreExpr #

data Unique #

Instances

Instances details
Show Unique 
Instance details

Defined in GHC.Types.Unique

Methods

showsPrec :: Int -> Unique -> ShowS

show :: Unique -> String

showList :: [Unique] -> ShowS

Uniquable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Unique -> Unique #

Outputable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

ppr :: Unique -> SDoc #

Eq Unique 
Instance details

Defined in GHC.Types.Unique

Methods

(==) :: Unique -> Unique -> Bool

(/=) :: Unique -> Unique -> Bool

data FindResult #

Constructors

Found ModLocation Module 
NoPackage Unit 
FoundMultiple [(Module, ModuleOrigin)] 
NotFound 

Fields

class NamedThing a where #

Minimal complete definition

getName

Methods

getOccName :: a -> OccName #

getName :: a -> Name #

Instances

Instances details
NamedThing Class 
Instance details

Defined in GHC.Core.Class

NamedThing ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

getOccName :: ConLike -> OccName #

getName :: ConLike -> Name #

NamedThing DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

getOccName :: DataCon -> OccName #

getName :: DataCon -> Name #

NamedThing FamInst 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

getOccName :: FamInst -> OccName #

getName :: FamInst -> Name #

NamedThing ClsInst 
Instance details

Defined in GHC.Core.InstEnv

NamedThing PatSyn 
Instance details

Defined in GHC.Core.PatSyn

Methods

getOccName :: PatSyn -> OccName #

getName :: PatSyn -> Name #

NamedThing TyCon 
Instance details

Defined in GHC.Core.TyCon

NamedThing IfaceClassOp 
Instance details

Defined in GHC.Iface.Syntax

Methods

getOccName :: IfaceClassOp -> OccName #

getName :: IfaceClassOp -> Name #

NamedThing IfaceConDecl 
Instance details

Defined in GHC.Iface.Syntax

Methods

getOccName :: IfaceConDecl -> OccName #

getName :: IfaceConDecl -> Name #

NamedThing IfaceDecl 
Instance details

Defined in GHC.Iface.Syntax

Methods

getOccName :: IfaceDecl -> OccName #

getName :: IfaceDecl -> Name #

NamedThing HoleFitCandidate 
Instance details

Defined in GHC.Tc.Errors.Hole.FitTypes

Methods

getOccName :: HoleFitCandidate -> OccName #

getName :: HoleFitCandidate -> Name #

NamedThing Name 
Instance details

Defined in GHC.Types.Name

NamedThing TyThing 
Instance details

Defined in GHC.Types.TyThing

Methods

getOccName :: TyThing -> OccName #

getName :: TyThing -> Name #

NamedThing Var 
Instance details

Defined in GHC.Types.Var

Methods

getOccName :: Var -> OccName #

getName :: Var -> Name #

NamedThing (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

getOccName :: CoAxiom br -> OccName #

getName :: CoAxiom br -> Name #

NamedThing e => NamedThing (Located e) 
Instance details

Defined in GHC.Types.Name

NamedThing (Located a) => NamedThing (LocatedAn an a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

getOccName :: LocatedAn an a -> OccName #

getName :: LocatedAn an a -> Name #

NamedThing tv => NamedThing (VarBndr tv flag) 
Instance details

Defined in GHC.Types.Var

Methods

getOccName :: VarBndr tv flag -> OccName #

getName :: VarBndr tv flag -> Name #

data BufSpan #

Constructors

BufSpan 

Instances

Instances details
Data BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BufSpan -> c BufSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BufSpan

toConstr :: BufSpan -> Constr

dataTypeOf :: BufSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BufSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BufSpan)

gmapT :: (forall b. Data b => b -> b) -> BufSpan -> BufSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BufSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BufSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> BufSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> BufSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan

Semigroup BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(<>) :: BufSpan -> BufSpan -> BufSpan

sconcat :: NonEmpty BufSpan -> BufSpan

stimes :: Integral b => b -> BufSpan -> BufSpan

Show BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> BufSpan -> ShowS

show :: BufSpan -> String

showList :: [BufSpan] -> ShowS

Eq BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufSpan -> BufSpan -> Bool

(/=) :: BufSpan -> BufSpan -> Bool

Ord BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: BufSpan -> BufSpan -> Ordering

(<) :: BufSpan -> BufSpan -> Bool

(<=) :: BufSpan -> BufSpan -> Bool

(>) :: BufSpan -> BufSpan -> Bool

(>=) :: BufSpan -> BufSpan -> Bool

max :: BufSpan -> BufSpan -> BufSpan

min :: BufSpan -> BufSpan -> BufSpan

data AddEpAnn #

Instances

Instances details
Data AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddEpAnn -> c AddEpAnn

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddEpAnn

toConstr :: AddEpAnn -> Constr

dataTypeOf :: AddEpAnn -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddEpAnn)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddEpAnn)

gmapT :: (forall b. Data b => b -> b) -> AddEpAnn -> AddEpAnn

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddEpAnn -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddEpAnn -> r

gmapQ :: (forall d. Data d => d -> u) -> AddEpAnn -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddEpAnn -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddEpAnn -> m AddEpAnn

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddEpAnn -> m AddEpAnn

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddEpAnn -> m AddEpAnn

Outputable AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AddEpAnn -> SDoc #

Eq AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AddEpAnn -> AddEpAnn -> Bool

(/=) :: AddEpAnn -> AddEpAnn -> Bool

data Anchor #

Constructors

Anchor 

Instances

Instances details
Data Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Anchor -> c Anchor

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Anchor

toConstr :: Anchor -> Constr

dataTypeOf :: Anchor -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Anchor)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Anchor)

gmapT :: (forall b. Data b => b -> b) -> Anchor -> Anchor

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Anchor -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Anchor -> r

gmapQ :: (forall d. Data d => d -> u) -> Anchor -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Anchor -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Anchor -> m Anchor

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Anchor -> m Anchor

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Anchor -> m Anchor

Semigroup Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: Anchor -> Anchor -> Anchor

sconcat :: NonEmpty Anchor -> Anchor

stimes :: Integral b => b -> Anchor -> Anchor

Show Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> Anchor -> ShowS

show :: Anchor -> String

showList :: [Anchor] -> ShowS

Outputable Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: Anchor -> SDoc #

Eq Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: Anchor -> Anchor -> Bool

(/=) :: Anchor -> Anchor -> Bool

Ord Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: Anchor -> Anchor -> Ordering

(<) :: Anchor -> Anchor -> Bool

(<=) :: Anchor -> Anchor -> Bool

(>) :: Anchor -> Anchor -> Bool

(>=) :: Anchor -> Anchor -> Bool

max :: Anchor -> Anchor -> Anchor

min :: Anchor -> Anchor -> Anchor

Outputable (GenLocated Anchor EpaComment) 
Instance details

Defined in GHC.Parser.Annotation

data AnchorOperation #

Instances

Instances details
Data AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnchorOperation -> c AnchorOperation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnchorOperation

toConstr :: AnchorOperation -> Constr

dataTypeOf :: AnchorOperation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnchorOperation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnchorOperation)

gmapT :: (forall b. Data b => b -> b) -> AnchorOperation -> AnchorOperation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnchorOperation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnchorOperation -> r

gmapQ :: (forall d. Data d => d -> u) -> AnchorOperation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnchorOperation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnchorOperation -> m AnchorOperation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnchorOperation -> m AnchorOperation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnchorOperation -> m AnchorOperation

Show AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> AnchorOperation -> ShowS

show :: AnchorOperation -> String

showList :: [AnchorOperation] -> ShowS

Outputable AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnchorOperation -> SDoc #

Eq AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

data AnnContext #

Instances

Instances details
Data AnnContext 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnContext -> c AnnContext

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnContext

toConstr :: AnnContext -> Constr

dataTypeOf :: AnnContext -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnContext)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnContext)

gmapT :: (forall b. Data b => b -> b) -> AnnContext -> AnnContext

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnContext -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnContext -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnContext -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnContext -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext

Outputable AnnContext 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnContext -> SDoc #

data AnnKeywordId #

Instances

Instances details
Data AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnKeywordId -> c AnnKeywordId

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnKeywordId

toConstr :: AnnKeywordId -> Constr

dataTypeOf :: AnnKeywordId -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnKeywordId)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnKeywordId)

gmapT :: (forall b. Data b => b -> b) -> AnnKeywordId -> AnnKeywordId

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnKeywordId -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnKeywordId -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnKeywordId -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnKeywordId -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId

Show AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> AnnKeywordId -> ShowS

show :: AnnKeywordId -> String

showList :: [AnnKeywordId] -> ShowS

Outputable AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnKeywordId -> SDoc #

Eq AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnKeywordId -> AnnKeywordId -> Bool

(/=) :: AnnKeywordId -> AnnKeywordId -> Bool

Ord AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

data AnnList #

Constructors

AnnList 

Fields

Instances

Instances details
Data AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnList -> c AnnList

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnList

toConstr :: AnnList -> Constr

dataTypeOf :: AnnList -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnList)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnList)

gmapT :: (forall b. Data b => b -> b) -> AnnList -> AnnList

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnList -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnList -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnList -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnList -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList

Monoid AnnList 
Instance details

Defined in GHC.Parser.Annotation

Semigroup AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: AnnList -> AnnList -> AnnList

sconcat :: NonEmpty AnnList -> AnnList

stimes :: Integral b => b -> AnnList -> AnnList

Outputable AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnList -> SDoc #

Eq AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnList -> AnnList -> Bool

(/=) :: AnnList -> AnnList -> Bool

data AnnListItem #

Constructors

AnnListItem 

Instances

Instances details
Data AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnListItem -> c AnnListItem

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnListItem

toConstr :: AnnListItem -> Constr

dataTypeOf :: AnnListItem -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnListItem)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnListItem)

gmapT :: (forall b. Data b => b -> b) -> AnnListItem -> AnnListItem

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnListItem -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnListItem -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnListItem -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnListItem -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem

Monoid AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Semigroup AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: AnnListItem -> AnnListItem -> AnnListItem

sconcat :: NonEmpty AnnListItem -> AnnListItem

stimes :: Integral b => b -> AnnListItem -> AnnListItem

Outputable AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnListItem -> SDoc #

Eq AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnListItem -> AnnListItem -> Bool

(/=) :: AnnListItem -> AnnListItem -> Bool

type Anno (LocatedA (IE (GhcPass p))) 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.PostProcess

type Anno [LocatedA (Match GhcPs (LocatedA (PatBuilder GhcPs)))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsCmd (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (HsExpr (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] 
Instance details

Defined in GHC.Hs.Expr

type Anno [LocatedA (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr))))] = SrcSpanAnnL
type Anno [LocatedA (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] 
Instance details

Defined in GHC.Parser.Types

type Anno [LocatedA (IE (GhcPass p))] 
Instance details

Defined in GHC.Hs.ImpExp

type Anno [LocatedA (ConDeclField (GhcPass _1))] 
Instance details

Defined in GHC.Hs.Decls

type Anno [LocatedA (HsType (GhcPass p))] 
Instance details

Defined in GHC.Hs.Type

type Anno (FamEqn p (LocatedA (HsType p))) 
Instance details

Defined in GHC.Hs.Decls

type Anno (GRHS (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (GRHS GhcPs (LocatedA (PatBuilder GhcPs))) = SrcAnn NoEpAnns
type Anno (Match (GhcPass p) (LocatedA (HsCmd (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (Match GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) 
Instance details

Defined in GHC.Hs.Expr

type Anno (StmtLR (GhcPass pl) (GhcPass pr) (LocatedA (body (GhcPass pr)))) = SrcSpanAnnA
type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) = SrcSpanAnnA
type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) 
Instance details

Defined in GHC.Hs.Expr

data AnnParen #

Instances

Instances details
Data AnnParen 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnParen -> c AnnParen

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnParen

toConstr :: AnnParen -> Constr

dataTypeOf :: AnnParen -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnParen)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnParen)

gmapT :: (forall b. Data b => b -> b) -> AnnParen -> AnnParen

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnParen -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnParen -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnParen -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnParen -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen

data AnnPragma #

Constructors

AnnPragma 

Instances

Instances details
Data AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnPragma -> c AnnPragma

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnPragma

toConstr :: AnnPragma -> Constr

dataTypeOf :: AnnPragma -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnPragma)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnPragma)

gmapT :: (forall b. Data b => b -> b) -> AnnPragma -> AnnPragma

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnPragma -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnPragma -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnPragma -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnPragma -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma

Outputable AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnPragma -> SDoc #

Eq AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnPragma -> AnnPragma -> Bool

(/=) :: AnnPragma -> AnnPragma -> Bool

data AnnSortKey #

Instances

Instances details
Data AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnSortKey -> c AnnSortKey

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnSortKey

toConstr :: AnnSortKey -> Constr

dataTypeOf :: AnnSortKey -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnSortKey)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnSortKey)

gmapT :: (forall b. Data b => b -> b) -> AnnSortKey -> AnnSortKey

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnSortKey -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnSortKey -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnSortKey -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnSortKey -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey

Monoid AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Semigroup AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: AnnSortKey -> AnnSortKey -> AnnSortKey

sconcat :: NonEmpty AnnSortKey -> AnnSortKey

stimes :: Integral b => b -> AnnSortKey -> AnnSortKey

Outputable AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: AnnSortKey -> SDoc #

Eq AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnSortKey -> AnnSortKey -> Bool

(/=) :: AnnSortKey -> AnnSortKey -> Bool

data DeltaPos #

Constructors

SameLine 

Fields

DifferentLine 

Fields

Instances

Instances details
Data DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeltaPos -> c DeltaPos

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeltaPos

toConstr :: DeltaPos -> Constr

dataTypeOf :: DeltaPos -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeltaPos)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeltaPos)

gmapT :: (forall b. Data b => b -> b) -> DeltaPos -> DeltaPos

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeltaPos -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeltaPos -> r

gmapQ :: (forall d. Data d => d -> u) -> DeltaPos -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeltaPos -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos

Show DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> DeltaPos -> ShowS

show :: DeltaPos -> String

showList :: [DeltaPos] -> ShowS

Outputable DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: DeltaPos -> SDoc #

Eq DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: DeltaPos -> DeltaPos -> Bool

(/=) :: DeltaPos -> DeltaPos -> Bool

Ord DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: DeltaPos -> DeltaPos -> Ordering

(<) :: DeltaPos -> DeltaPos -> Bool

(<=) :: DeltaPos -> DeltaPos -> Bool

(>) :: DeltaPos -> DeltaPos -> Bool

(>=) :: DeltaPos -> DeltaPos -> Bool

max :: DeltaPos -> DeltaPos -> DeltaPos

min :: DeltaPos -> DeltaPos -> DeltaPos

data EpAnnComments #

Instances

Instances details
Data EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnnComments -> c EpAnnComments

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpAnnComments

toConstr :: EpAnnComments -> Constr

dataTypeOf :: EpAnnComments -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpAnnComments)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpAnnComments)

gmapT :: (forall b. Data b => b -> b) -> EpAnnComments -> EpAnnComments

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnComments -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnComments -> r

gmapQ :: (forall d. Data d => d -> u) -> EpAnnComments -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnnComments -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments

Semigroup EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Outputable EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpAnnComments -> SDoc #

Eq EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

data EpaComment #

Instances

Instances details
Data EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaComment -> c EpaComment

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaComment

toConstr :: EpaComment -> Constr

dataTypeOf :: EpaComment -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaComment)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaComment)

gmapT :: (forall b. Data b => b -> b) -> EpaComment -> EpaComment

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaComment -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaComment -> r

gmapQ :: (forall d. Data d => d -> u) -> EpaComment -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaComment -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment

Show EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> EpaComment -> ShowS

show :: EpaComment -> String

showList :: [EpaComment] -> ShowS

Outputable EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpaComment -> SDoc #

Eq EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpaComment -> EpaComment -> Bool

(/=) :: EpaComment -> EpaComment -> Bool

Outputable (GenLocated Anchor EpaComment) 
Instance details

Defined in GHC.Parser.Annotation

data EpaCommentTok #

Constructors

EpaDocComment HsDocString 
EpaDocOptions String 
EpaLineComment String 
EpaBlockComment String 
EpaEofComment 

Instances

Instances details
Data EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaCommentTok -> c EpaCommentTok

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaCommentTok

toConstr :: EpaCommentTok -> Constr

dataTypeOf :: EpaCommentTok -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaCommentTok)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaCommentTok)

gmapT :: (forall b. Data b => b -> b) -> EpaCommentTok -> EpaCommentTok

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaCommentTok -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaCommentTok -> r

gmapQ :: (forall d. Data d => d -> u) -> EpaCommentTok -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaCommentTok -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok

Show EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> EpaCommentTok -> ShowS

show :: EpaCommentTok -> String

showList :: [EpaCommentTok] -> ShowS

Eq EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

data EpaLocation #

Instances

Instances details
Data EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaLocation -> c EpaLocation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaLocation

toConstr :: EpaLocation -> Constr

dataTypeOf :: EpaLocation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaLocation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaLocation)

gmapT :: (forall b. Data b => b -> b) -> EpaLocation -> EpaLocation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaLocation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaLocation -> r

gmapQ :: (forall d. Data d => d -> u) -> EpaLocation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaLocation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation

Outputable EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: EpaLocation -> SDoc #

Eq EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpaLocation -> EpaLocation -> Bool

(/=) :: EpaLocation -> EpaLocation -> Bool

data HasE #

Constructors

HasE 
NoE 

Instances

Instances details
Data HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HasE -> c HasE

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HasE

toConstr :: HasE -> Constr

dataTypeOf :: HasE -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HasE)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HasE)

gmapT :: (forall b. Data b => b -> b) -> HasE -> HasE

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HasE -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HasE -> r

gmapQ :: (forall d. Data d => d -> u) -> HasE -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HasE -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HasE -> m HasE

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HasE -> m HasE

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HasE -> m HasE

Show HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> HasE -> ShowS

show :: HasE -> String

showList :: [HasE] -> ShowS

Eq HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: HasE -> HasE -> Bool

(/=) :: HasE -> HasE -> Bool

Ord HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: HasE -> HasE -> Ordering

(<) :: HasE -> HasE -> Bool

(<=) :: HasE -> HasE -> Bool

(>) :: HasE -> HasE -> Bool

(>=) :: HasE -> HasE -> Bool

max :: HasE -> HasE -> HasE

min :: HasE -> HasE -> HasE

data IsUnicodeSyntax #

Instances

Instances details
Data IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsUnicodeSyntax -> c IsUnicodeSyntax

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsUnicodeSyntax

toConstr :: IsUnicodeSyntax -> Constr

dataTypeOf :: IsUnicodeSyntax -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsUnicodeSyntax)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsUnicodeSyntax)

gmapT :: (forall b. Data b => b -> b) -> IsUnicodeSyntax -> IsUnicodeSyntax

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsUnicodeSyntax -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsUnicodeSyntax -> r

gmapQ :: (forall d. Data d => d -> u) -> IsUnicodeSyntax -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsUnicodeSyntax -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax

Show IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> IsUnicodeSyntax -> ShowS

show :: IsUnicodeSyntax -> String

showList :: [IsUnicodeSyntax] -> ShowS

Outputable IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: IsUnicodeSyntax -> SDoc #

Eq IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Ord IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

data NameAdornment #

Instances

Instances details
Data NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameAdornment -> c NameAdornment

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameAdornment

toConstr :: NameAdornment -> Constr

dataTypeOf :: NameAdornment -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameAdornment)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameAdornment)

gmapT :: (forall b. Data b => b -> b) -> NameAdornment -> NameAdornment

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameAdornment -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameAdornment -> r

gmapQ :: (forall d. Data d => d -> u) -> NameAdornment -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameAdornment -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment

Outputable NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NameAdornment -> SDoc #

Eq NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Ord NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

data NameAnn #

Instances

Instances details
Data NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameAnn -> c NameAnn

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameAnn

toConstr :: NameAnn -> Constr

dataTypeOf :: NameAnn -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameAnn)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameAnn)

gmapT :: (forall b. Data b => b -> b) -> NameAnn -> NameAnn

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameAnn -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameAnn -> r

gmapQ :: (forall d. Data d => d -> u) -> NameAnn -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameAnn -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn

Monoid NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Semigroup NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: NameAnn -> NameAnn -> NameAnn

sconcat :: NonEmpty NameAnn -> NameAnn

stimes :: Integral b => b -> NameAnn -> NameAnn

Outputable NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NameAnn -> SDoc #

Eq NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NameAnn -> NameAnn -> Bool

(/=) :: NameAnn -> NameAnn -> Bool

type Anno (LocatedN Name) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) 
Instance details

Defined in GHC.Hs.Binds

type Anno (LocatedN RdrName) = SrcSpan
type Anno (LocatedN Id) 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN Name] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] 
Instance details

Defined in GHC.Hs.Binds

type Anno [LocatedN RdrName] = SrcSpan
type Anno [LocatedN Id] 
Instance details

Defined in GHC.Hs.Binds

data NoEpAnns #

Constructors

NoEpAnns 

Instances

Instances details
Data NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoEpAnns -> c NoEpAnns

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoEpAnns

toConstr :: NoEpAnns -> Constr

dataTypeOf :: NoEpAnns -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoEpAnns)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoEpAnns)

gmapT :: (forall b. Data b => b -> b) -> NoEpAnns -> NoEpAnns

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoEpAnns -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoEpAnns -> r

gmapQ :: (forall d. Data d => d -> u) -> NoEpAnns -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoEpAnns -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns

Semigroup NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: NoEpAnns -> NoEpAnns -> NoEpAnns

sconcat :: NonEmpty NoEpAnns -> NoEpAnns

stimes :: Integral b => b -> NoEpAnns -> NoEpAnns

Outputable NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: NoEpAnns -> SDoc #

Eq NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NoEpAnns -> NoEpAnns -> Bool

(/=) :: NoEpAnns -> NoEpAnns -> Bool

Ord NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: NoEpAnns -> NoEpAnns -> Ordering

(<) :: NoEpAnns -> NoEpAnns -> Bool

(<=) :: NoEpAnns -> NoEpAnns -> Bool

(>) :: NoEpAnns -> NoEpAnns -> Bool

(>=) :: NoEpAnns -> NoEpAnns -> Bool

max :: NoEpAnns -> NoEpAnns -> NoEpAnns

min :: NoEpAnns -> NoEpAnns -> NoEpAnns

data ParenType #

Instances

Instances details
Data ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParenType -> c ParenType

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParenType

toConstr :: ParenType -> Constr

dataTypeOf :: ParenType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParenType)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParenType)

gmapT :: (forall b. Data b => b -> b) -> ParenType -> ParenType

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParenType -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParenType -> r

gmapQ :: (forall d. Data d => d -> u) -> ParenType -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParenType -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType

Eq ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: ParenType -> ParenType -> Bool

(/=) :: ParenType -> ParenType -> Bool

Ord ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: ParenType -> ParenType -> Ordering

(<) :: ParenType -> ParenType -> Bool

(<=) :: ParenType -> ParenType -> Bool

(>) :: ParenType -> ParenType -> Bool

(>=) :: ParenType -> ParenType -> Bool

max :: ParenType -> ParenType -> ParenType

min :: ParenType -> ParenType -> ParenType

data TrailingAnn #

Instances

Instances details
Data TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TrailingAnn -> c TrailingAnn

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TrailingAnn

toConstr :: TrailingAnn -> Constr

dataTypeOf :: TrailingAnn -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TrailingAnn)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TrailingAnn)

gmapT :: (forall b. Data b => b -> b) -> TrailingAnn -> TrailingAnn

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TrailingAnn -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TrailingAnn -> r

gmapQ :: (forall d. Data d => d -> u) -> TrailingAnn -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TrailingAnn -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn

Outputable TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

ppr :: TrailingAnn -> SDoc #

Eq TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: TrailingAnn -> TrailingAnn -> Bool

(/=) :: TrailingAnn -> TrailingAnn -> Bool

type LocatedAn an = GenLocated (SrcAnn an) #

type SrcAnn ann = SrcSpanAnn' (EpAnn ann) #

data BindingSite #

Instances

Instances details
Eq BindingSite 
Instance details

Defined in GHC.Utils.Outputable

Methods

(==) :: BindingSite -> BindingSite -> Bool

(/=) :: BindingSite -> BindingSite -> Bool

newtype BufPos #

Constructors

BufPos 

Fields

Instances

Instances details
Data BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BufPos -> c BufPos

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BufPos

toConstr :: BufPos -> Constr

dataTypeOf :: BufPos -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BufPos)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BufPos)

gmapT :: (forall b. Data b => b -> b) -> BufPos -> BufPos

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BufPos -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BufPos -> r

gmapQ :: (forall d. Data d => d -> u) -> BufPos -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> BufPos -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos

Show BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> BufPos -> ShowS

show :: BufPos -> String

showList :: [BufPos] -> ShowS

Eq BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufPos -> BufPos -> Bool

(/=) :: BufPos -> BufPos -> Bool

Ord BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: BufPos -> BufPos -> Ordering

(<) :: BufPos -> BufPos -> Bool

(<=) :: BufPos -> BufPos -> Bool

(>) :: BufPos -> BufPos -> Bool

(>=) :: BufPos -> BufPos -> Bool

max :: BufPos -> BufPos -> BufPos

min :: BufPos -> BufPos -> BufPos

data PsSpan #

Constructors

PsSpan 

Instances

Instances details
Data PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PsSpan -> c PsSpan

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PsSpan

toConstr :: PsSpan -> Constr

dataTypeOf :: PsSpan -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PsSpan)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PsSpan)

gmapT :: (forall b. Data b => b -> b) -> PsSpan -> PsSpan

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PsSpan -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PsSpan -> r

gmapQ :: (forall d. Data d => d -> u) -> PsSpan -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PsSpan -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan

Show PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> PsSpan -> ShowS

show :: PsSpan -> String

showList :: [PsSpan] -> ShowS

Eq PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsSpan -> PsSpan -> Bool

(/=) :: PsSpan -> PsSpan -> Bool

Ord PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: PsSpan -> PsSpan -> Ordering

(<) :: PsSpan -> PsSpan -> Bool

(<=) :: PsSpan -> PsSpan -> Bool

(>) :: PsSpan -> PsSpan -> Bool

(>=) :: PsSpan -> PsSpan -> Bool

max :: PsSpan -> PsSpan -> PsSpan

min :: PsSpan -> PsSpan -> PsSpan

data PsLoc #

Constructors

PsLoc 

Instances

Instances details
Show PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> PsLoc -> ShowS

show :: PsLoc -> String

showList :: [PsLoc] -> ShowS

Eq PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsLoc -> PsLoc -> Bool

(/=) :: PsLoc -> PsLoc -> Bool

Ord PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: PsLoc -> PsLoc -> Ordering

(<) :: PsLoc -> PsLoc -> Bool

(<=) :: PsLoc -> PsLoc -> Bool

(>) :: PsLoc -> PsLoc -> Bool

(>=) :: PsLoc -> PsLoc -> Bool

max :: PsLoc -> PsLoc -> PsLoc

min :: PsLoc -> PsLoc -> PsLoc

data RealSrcLoc #

Instances

Instances details
Show RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> RealSrcLoc -> ShowS

show :: RealSrcLoc -> String

showList :: [RealSrcLoc] -> ShowS

Outputable RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

ppr :: RealSrcLoc -> SDoc #

Eq RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: RealSrcLoc -> RealSrcLoc -> Bool

(/=) :: RealSrcLoc -> RealSrcLoc -> Bool

Ord RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

data FastZString #

Instances

Instances details
NFData FastZString 
Instance details

Defined in GHC.Data.FastString

Methods

rnf :: FastZString -> ()

data NameSpace #

Instances

Instances details
Binary NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

put_ :: BinHandle -> NameSpace -> IO ()

put :: BinHandle -> NameSpace -> IO (Bin NameSpace)

get :: BinHandle -> IO NameSpace

Eq NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

(==) :: NameSpace -> NameSpace -> Bool

(/=) :: NameSpace -> NameSpace -> Bool

Ord NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

compare :: NameSpace -> NameSpace -> Ordering

(<) :: NameSpace -> NameSpace -> Bool

(<=) :: NameSpace -> NameSpace -> Bool

(>) :: NameSpace -> NameSpace -> Bool

(>=) :: NameSpace -> NameSpace -> Bool

max :: NameSpace -> NameSpace -> NameSpace

min :: NameSpace -> NameSpace -> NameSpace

type TidyOccEnv = UniqFM FastString Int #

class Uniquable a where #

Methods

getUnique :: a -> Unique #

Instances

Instances details
Uniquable Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

getUnique :: Label -> Unique #

Uniquable Class 
Instance details

Defined in GHC.Core.Class

Methods

getUnique :: Class -> Unique #

Uniquable CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

getUnique :: CoAxiomRule -> Unique #

Uniquable ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

getUnique :: ConLike -> Unique #

Uniquable DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

getUnique :: DataCon -> Unique #

Uniquable PatSyn 
Instance details

Defined in GHC.Core.PatSyn

Methods

getUnique :: PatSyn -> Unique #

Uniquable CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Uniquable TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

getUnique :: TyCon -> Unique #

Uniquable FastString 
Instance details

Defined in GHC.Types.Unique

Uniquable EvBindsVar 
Instance details

Defined in GHC.Tc.Types.Evidence

Uniquable SkolemInfo 
Instance details

Defined in GHC.Tc.Types.Origin

Uniquable Name 
Instance details

Defined in GHC.Types.Name

Methods

getUnique :: Name -> Unique #

Uniquable OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

getUnique :: OccName -> Unique #

Uniquable Unique 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Unique -> Unique #

Uniquable Var 
Instance details

Defined in GHC.Types.Var

Methods

getUnique :: Var -> Unique #

Uniquable PackageId 
Instance details

Defined in GHC.Unit.Info

Methods

getUnique :: PackageId -> Unique #

Uniquable PackageName 
Instance details

Defined in GHC.Unit.Info

Methods

getUnique :: PackageName -> Unique #

Uniquable Module 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Module -> Unique #

Uniquable UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: UnitId -> Unique #

Uniquable ModuleName 
Instance details

Defined in GHC.Types.Unique

Uniquable Int 
Instance details

Defined in GHC.Types.Unique

Methods

getUnique :: Int -> Unique #

Uniquable (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

getUnique :: CoAxiom br -> Unique #

Uniquable unit => Uniquable (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Definite unit -> Unique #

IsUnitId u => Uniquable (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: GenUnit u -> Unique #

data HLine #

Instances

Instances details
IsLine HLine 
Instance details

Defined in GHC.Utils.Outputable

Methods

char :: Char -> HLine #

text :: String -> HLine #

ftext :: FastString -> HLine #

ztext :: FastZString -> HLine #

(<>) :: HLine -> HLine -> HLine #

(<+>) :: HLine -> HLine -> HLine #

sep :: [HLine] -> HLine #

fsep :: [HLine] -> HLine #

hcat :: [HLine] -> HLine #

hsep :: [HLine] -> HLine #

dualLine :: SDoc -> HLine -> HLine #

IsOutput HLine 
Instance details

Defined in GHC.Utils.Outputable

class IsOutput doc => IsLine doc where #

Minimal complete definition

char, text, ftext, ztext, (<>), (<+>), sep, fsep, dualLine

Methods

char :: Char -> doc #

text :: String -> doc #

ftext :: FastString -> doc #

ztext :: FastZString -> doc #

(<>) :: doc -> doc -> doc #

(<+>) :: doc -> doc -> doc #

sep :: [doc] -> doc #

fsep :: [doc] -> doc #

hcat :: [doc] -> doc #

hsep :: [doc] -> doc #

dualLine :: SDoc -> HLine -> doc #

Instances

Instances details
IsLine HLine 
Instance details

Defined in GHC.Utils.Outputable

Methods

char :: Char -> HLine #

text :: String -> HLine #

ftext :: FastString -> HLine #

ztext :: FastZString -> HLine #

(<>) :: HLine -> HLine -> HLine #

(<+>) :: HLine -> HLine -> HLine #

sep :: [HLine] -> HLine #

fsep :: [HLine] -> HLine #

hcat :: [HLine] -> HLine #

hsep :: [HLine] -> HLine #

dualLine :: SDoc -> HLine -> HLine #

IsLine SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

char :: Char -> SDoc #

text :: String -> SDoc #

ftext :: FastString -> SDoc #

ztext :: FastZString -> SDoc #

(<>) :: SDoc -> SDoc -> SDoc #

(<+>) :: SDoc -> SDoc -> SDoc #

sep :: [SDoc] -> SDoc #

fsep :: [SDoc] -> SDoc #

hcat :: [SDoc] -> SDoc #

hsep :: [SDoc] -> SDoc #

dualLine :: SDoc -> HLine -> SDoc #

data PprStyle #

Instances

Instances details
Outputable PprStyle 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: PprStyle -> SDoc #

type TyCoVar = Id #

data FinderOpts #

Constructors

FinderOpts 

Fields

Instances

Instances details
Show FinderOpts 
Instance details

Defined in GHC.Unit.Finder.Types

Methods

showsPrec :: Int -> FinderOpts -> ShowS

show :: FinderOpts -> String

showList :: [FinderOpts] -> ShowS

newtype Definite unit #

Constructors

Definite 

Fields

Instances

Instances details
Functor Definite 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> Definite a -> Definite b

(<$) :: a -> Definite b -> Definite a

Uniquable unit => Uniquable (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Definite unit -> Unique #

IsUnitId unit => IsUnitId (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: Definite unit -> FastString #

Binary unit => Binary (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> Definite unit -> IO ()

put :: BinHandle -> Definite unit -> IO (Bin (Definite unit))

get :: BinHandle -> IO (Definite unit)

Outputable unit => Outputable (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Definite unit -> SDoc #

Eq unit => Eq (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: Definite unit -> Definite unit -> Bool

(/=) :: Definite unit -> Definite unit -> Bool

Ord unit => Ord (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: Definite unit -> Definite unit -> Ordering

(<) :: Definite unit -> Definite unit -> Bool

(<=) :: Definite unit -> Definite unit -> Bool

(>) :: Definite unit -> Definite unit -> Bool

(>=) :: Definite unit -> Definite unit -> Bool

max :: Definite unit -> Definite unit -> Definite unit

min :: Definite unit -> Definite unit -> Definite unit

data GenModule unit #

Constructors

Module 

Fields

Instances

Instances details
Functor GenModule 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenModule a -> GenModule b

(<$) :: a -> GenModule b -> GenModule a

Uniquable Module 
Instance details

Defined in GHC.Unit.Types

Methods

getUnique :: Module -> Unique #

Outputable InstalledModule 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstalledModule -> SDoc #

Outputable InstantiatedModule 
Instance details

Defined in GHC.Unit.Types

Outputable Module 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: Module -> SDoc #

Data unit => Data (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenModule unit -> c (GenModule unit)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenModule unit)

toConstr :: GenModule unit -> Constr

dataTypeOf :: GenModule unit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenModule unit))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GenModule unit))

gmapT :: (forall b. Data b => b -> b) -> GenModule unit -> GenModule unit

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenModule unit -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenModule unit -> r

gmapQ :: (forall d. Data d => d -> u) -> GenModule unit -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenModule unit -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit)

NFData (GenModule a) 
Instance details

Defined in GHC.Unit.Types

Methods

rnf :: GenModule a -> ()

Binary a => Binary (GenModule a) 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> GenModule a -> IO ()

put :: BinHandle -> GenModule a -> IO (Bin (GenModule a))

get :: BinHandle -> IO (GenModule a)

Eq unit => Eq (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenModule unit -> GenModule unit -> Bool

(/=) :: GenModule unit -> GenModule unit -> Bool

Ord unit => Ord (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: GenModule unit -> GenModule unit -> Ordering

(<) :: GenModule unit -> GenModule unit -> Bool

(<=) :: GenModule unit -> GenModule unit -> Bool

(>) :: GenModule unit -> GenModule unit -> Bool

(>=) :: GenModule unit -> GenModule unit -> Bool

max :: GenModule unit -> GenModule unit -> GenModule unit

min :: GenModule unit -> GenModule unit -> GenModule unit

data GenInstantiatedUnit unit #

Instances

Instances details
Binary InstantiatedUnit 
Instance details

Defined in GHC.Unit.Types

Methods

put_ :: BinHandle -> InstantiatedUnit -> IO ()

put :: BinHandle -> InstantiatedUnit -> IO (Bin InstantiatedUnit)

get :: BinHandle -> IO InstantiatedUnit

Outputable InstantiatedModule 
Instance details

Defined in GHC.Unit.Types

Outputable InstantiatedUnit 
Instance details

Defined in GHC.Unit.Types

Methods

ppr :: InstantiatedUnit -> SDoc #

Eq (GenInstantiatedUnit unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool

(/=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool

Ord (GenInstantiatedUnit unit) 
Instance details

Defined in GHC.Unit.Types

class IsUnitId u where #

Methods

unitFS :: u -> FastString #

Instances

Instances details
IsUnitId UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: UnitId -> FastString #

IsUnitId UnitKey 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: UnitKey -> FastString #

IsUnitId unit => IsUnitId (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: Definite unit -> FastString #

IsUnitId u => IsUnitId (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: GenUnit u -> FastString #

newtype UnitKey #

Constructors

UnitKey FastString 

Instances

Instances details
IsUnitId UnitKey 
Instance details

Defined in GHC.Unit.Types

Methods

unitFS :: UnitKey -> FastString #

type Mult = Type #

data Scaled a #

Constructors

Scaled !Mult a 

Instances

Instances details
Data a => Data (Scaled a) 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Scaled a -> c (Scaled a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Scaled a)

toConstr :: Scaled a -> Constr

dataTypeOf :: Scaled a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Scaled a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Scaled a))

gmapT :: (forall b. Data b => b -> b) -> Scaled a -> Scaled a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Scaled a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Scaled a -> r

gmapQ :: (forall d. Data d => d -> u) -> Scaled a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Scaled a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a)

Outputable a => Outputable (Scaled a) 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Scaled a -> SDoc #

data IOEnvFailure #

Constructors

IOEnvFailure 

Instances

Instances details
Exception IOEnvFailure 
Instance details

Defined in GHC.Data.IOEnv

Methods

toException :: IOEnvFailure -> SomeException

fromException :: SomeException -> Maybe IOEnvFailure

displayException :: IOEnvFailure -> String

Show IOEnvFailure 
Instance details

Defined in GHC.Data.IOEnv

Methods

showsPrec :: Int -> IOEnvFailure -> ShowS

show :: IOEnvFailure -> String

showList :: [IOEnvFailure] -> ShowS

type Cts = Bag Ct #

data DelayedError #

Instances

Instances details
Outputable DelayedError 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: DelayedError -> SDoc #

data Hole #

Constructors

Hole 

Fields

Instances

Instances details
Outputable Hole 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Hole -> SDoc #

data Implication #

Instances

Instances details
Outputable Implication 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: Implication -> SDoc #

data NotConcreteError #

Instances

Instances details
Outputable NotConcreteError 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: NotConcreteError -> SDoc #

newtype EvBindMap #

Constructors

EvBindMap 

Fields

Instances

Instances details
Outputable EvBindMap 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvBindMap -> SDoc #

data TypeOrKind #

Constructors

TypeLevel 
KindLevel 

Instances

Instances details
Outputable TypeOrKind 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TypeOrKind -> SDoc #

Eq TypeOrKind 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TypeOrKind -> TypeOrKind -> Bool

(/=) :: TypeOrKind -> TypeOrKind -> Bool

data IsExtraConstraint #

Instances

Instances details
Outputable IsExtraConstraint 
Instance details

Defined in GHC.Tc.Utils.Monad

class Monad m => MonadIO (m :: Type -> Type) where #

Methods

liftIO :: IO a -> m a #

Instances

Instances details
MonadIO CoreM 
Instance details

Defined in GHC.Core.Opt.Monad

Methods

liftIO :: IO a -> CoreM a #

MonadIO Hsc 
Instance details

Defined in GHC.Driver.Env.Types

Methods

liftIO :: IO a -> Hsc a #

MonadIO TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

liftIO :: IO a -> TcS a #

MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

liftIO :: IO a -> IOEnv env a #

MonadIO m => MonadIO (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

liftIO :: IO a -> InputT m a #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

(Monoid w, Functor m, MonadIO m) => MonadIO (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

liftIO :: IO a -> AccumT w m a #

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadIO m => MonadIO (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

liftIO :: IO a -> SelectT r m a #

MonadIO m => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

liftIO :: IO a -> WriterT w m a #

data OverlapFlag #

Constructors

OverlapFlag 

Instances

Instances details
Data OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverlapFlag -> c OverlapFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverlapFlag

toConstr :: OverlapFlag -> Constr

dataTypeOf :: OverlapFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverlapFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverlapFlag)

gmapT :: (forall b. Data b => b -> b) -> OverlapFlag -> OverlapFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverlapFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverlapFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> OverlapFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverlapFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag

Binary OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> OverlapFlag -> IO ()

put :: BinHandle -> OverlapFlag -> IO (Bin OverlapFlag)

get :: BinHandle -> IO OverlapFlag

Outputable OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OverlapFlag -> SDoc #

Eq OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OverlapFlag -> OverlapFlag -> Bool

(/=) :: OverlapFlag -> OverlapFlag -> Bool

class Monad m => MonadFix (m :: Type -> Type) where #

Methods

mfix :: (a -> m a) -> m a #

Instances

Instances details
MonadFix First 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> First a) -> First a #

MonadFix Last 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Last a) -> Last a #

MonadFix Down 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Down a) -> Down a #

MonadFix Dual 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Dual a) -> Dual a #

MonadFix Product 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Product a) -> Product a #

MonadFix Sum 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Sum a) -> Sum a #

MonadFix NonEmpty 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> NonEmpty a) -> NonEmpty a #

MonadFix Par1 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Par1 a) -> Par1 a #

MonadFix Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> Seq a) -> Seq a #

MonadFix Tree 
Instance details

Defined in Data.Tree

Methods

mfix :: (a -> Tree a) -> Tree a #

MonadFix TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

mfix :: (a -> TcS a) -> TcS a #

MonadFix UniqSM 
Instance details

Defined in GHC.Types.Unique.Supply

Methods

mfix :: (a -> UniqSM a) -> UniqSM a #

MonadFix IO 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> IO a) -> IO a #

MonadFix Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

mfix :: (a -> Q a) -> Q a #

MonadFix Maybe 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Maybe a) -> Maybe a #

MonadFix Solo 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Solo a) -> Solo a #

MonadFix List 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> [a]) -> [a] #

MonadFix (Either e) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Either e a) -> Either e a #

MonadFix (ST s) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> ST s a) -> ST s a #

MonadFix (IOEnv env) 
Instance details

Defined in GHC.Data.IOEnv

Methods

mfix :: (a -> IOEnv env a) -> IOEnv env a #

MonadFix m => MonadFix (InputT m) 
Instance details

Defined in System.Console.Haskeline.InputT

Methods

mfix :: (a -> InputT m a) -> InputT m a #

MonadFix m => MonadFix (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mfix :: (a -> MaybeT m a) -> MaybeT m a #

MonadFix f => MonadFix (Ap f) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Ap f a) -> Ap f a #

MonadFix f => MonadFix (Alt f) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Alt f a) -> Alt f a #

MonadFix f => MonadFix (Rec1 f) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Rec1 f a) -> Rec1 f a #

(Monoid w, Functor m, MonadFix m) => MonadFix (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

mfix :: (a -> AccumT w m a) -> AccumT w m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a #

MonadFix m => MonadFix (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

mfix :: (a -> WriterT w m a) -> WriterT w m a #

(MonadFix f, MonadFix g) => MonadFix (f :*: g) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> (f :*: g) a) -> (f :*: g) a #

MonadFix ((->) r) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> r -> a) -> r -> a #

MonadFix f => MonadFix (M1 i c f) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> M1 i c f a) -> M1 i c f a #

newtype NonDetFastString #

Instances

Instances details
Data NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonDetFastString -> c NonDetFastString

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NonDetFastString

toConstr :: NonDetFastString -> Constr

dataTypeOf :: NonDetFastString -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NonDetFastString)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NonDetFastString)

gmapT :: (forall b. Data b => b -> b) -> NonDetFastString -> NonDetFastString

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonDetFastString -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonDetFastString -> r

gmapQ :: (forall d. Data d => d -> u) -> NonDetFastString -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonDetFastString -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonDetFastString -> m NonDetFastString

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonDetFastString -> m NonDetFastString

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonDetFastString -> m NonDetFastString

Show NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> NonDetFastString -> ShowS

show :: NonDetFastString -> String

showList :: [NonDetFastString] -> ShowS

Outputable NonDetFastString 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: NonDetFastString -> SDoc #

Eq NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Ord NonDetFastString 
Instance details

Defined in GHC.Data.FastString

data PtrString #

Constructors

PtrString !(Ptr Word8) !Int 

data AbsBinds #

Constructors

AbsBinds 

data AnnsIf #

Instances

Instances details
Data AnnsIf 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnsIf -> c AnnsIf

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnsIf

toConstr :: AnnsIf -> Constr

dataTypeOf :: AnnsIf -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnsIf)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnsIf)

gmapT :: (forall b. Data b => b -> b) -> AnnsIf -> AnnsIf

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnsIf -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnsIf -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnsIf -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnsIf -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnsIf -> m AnnsIf

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnsIf -> m AnnsIf

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnsIf -> m AnnsIf

data GrhsAnn #

Constructors

GrhsAnn 

Fields

Instances

Instances details
Data GrhsAnn 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GrhsAnn -> c GrhsAnn

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GrhsAnn

toConstr :: GrhsAnn -> Constr

dataTypeOf :: GrhsAnn -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GrhsAnn)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GrhsAnn)

gmapT :: (forall b. Data b => b -> b) -> GrhsAnn -> GrhsAnn

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GrhsAnn -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GrhsAnn -> r

gmapQ :: (forall d. Data d => d -> u) -> GrhsAnn -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> GrhsAnn -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GrhsAnn -> m GrhsAnn

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GrhsAnn -> m GrhsAnn

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GrhsAnn -> m GrhsAnn

Outputable GrhsAnn 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: GrhsAnn -> SDoc #

data HsWrap (hs_syn :: Type -> Type) #

Constructors

HsWrap HsWrapper (hs_syn GhcTc) 

Instances

Instances details
(Data (hs_syn GhcTc), Typeable hs_syn) => Data (HsWrap hs_syn) 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsWrap hs_syn -> c (HsWrap hs_syn)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsWrap hs_syn)

toConstr :: HsWrap hs_syn -> Constr

dataTypeOf :: HsWrap hs_syn -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsWrap hs_syn))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsWrap hs_syn))

gmapT :: (forall b. Data b => b -> b) -> HsWrap hs_syn -> HsWrap hs_syn

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsWrap hs_syn -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsWrap hs_syn -> r

gmapQ :: (forall d. Data d => d -> u) -> HsWrap hs_syn -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsWrap hs_syn -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn)

data SyntaxExprTc #

Instances

Instances details
Outputable SyntaxExprTc 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: SyntaxExprTc -> SDoc #

data HsWrapper #

Instances

Instances details
Data HsWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsWrapper -> c HsWrapper

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsWrapper

toConstr :: HsWrapper -> Constr

dataTypeOf :: HsWrapper -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsWrapper)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsWrapper)

gmapT :: (forall b. Data b => b -> b) -> HsWrapper -> HsWrapper

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsWrapper -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsWrapper -> r

gmapQ :: (forall d. Data d => d -> u) -> HsWrapper -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsWrapper -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsWrapper -> m HsWrapper

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrapper -> m HsWrapper

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrapper -> m HsWrapper

Monoid HsWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Semigroup HsWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

(<>) :: HsWrapper -> HsWrapper -> HsWrapper

sconcat :: NonEmpty HsWrapper -> HsWrapper

stimes :: Integral b => b -> HsWrapper -> HsWrapper

Outputable HsWrapper 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: HsWrapper -> SDoc #

data TcEvBinds #

Instances

Instances details
Data TcEvBinds 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TcEvBinds -> c TcEvBinds

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TcEvBinds

toConstr :: TcEvBinds -> Constr

dataTypeOf :: TcEvBinds -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TcEvBinds)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TcEvBinds)

gmapT :: (forall b. Data b => b -> b) -> TcEvBinds -> TcEvBinds

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TcEvBinds -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TcEvBinds -> r

gmapQ :: (forall d. Data d => d -> u) -> TcEvBinds -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TcEvBinds -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TcEvBinds -> m TcEvBinds

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TcEvBinds -> m TcEvBinds

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TcEvBinds -> m TcEvBinds

Outputable TcEvBinds 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: TcEvBinds -> SDoc #

data RecFlag #

Constructors

Recursive 
NonRecursive 

Instances

Instances details
Data RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecFlag -> c RecFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecFlag

toConstr :: RecFlag -> Constr

dataTypeOf :: RecFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecFlag)

gmapT :: (forall b. Data b => b -> b) -> RecFlag -> RecFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> RecFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag

Binary RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> RecFlag -> IO ()

put :: BinHandle -> RecFlag -> IO (Bin RecFlag)

get :: BinHandle -> IO RecFlag

Outputable RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: RecFlag -> SDoc #

Eq RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: RecFlag -> RecFlag -> Bool

(/=) :: RecFlag -> RecFlag -> Bool

data Boxity #

Constructors

Boxed 
Unboxed 

Instances

Instances details
Data Boxity 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Boxity -> c Boxity

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Boxity

toConstr :: Boxity -> Constr

dataTypeOf :: Boxity -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Boxity)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Boxity)

gmapT :: (forall b. Data b => b -> b) -> Boxity -> Boxity

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Boxity -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Boxity -> r

gmapQ :: (forall d. Data d => d -> u) -> Boxity -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Boxity -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity

Eq Boxity 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Boxity -> Boxity -> Bool

(/=) :: Boxity -> Boxity -> Bool

class UnXRec p => CollectPass p where #

Methods

collectXXPat :: CollectFlag p -> XXPat p -> [IdP p] -> [IdP p] #

collectXXHsBindsLR :: XXHsBindsLR p pR -> [IdP p] -> [IdP p] #

collectXSplicePat :: CollectFlag p -> XSplicePat p -> [IdP p] -> [IdP p] #

Instances

Instances details
IsPass p => CollectPass (GhcPass p) 
Instance details

Defined in GHC.Hs.Utils

data ABExport #

Constructors

ABE 

Instances

Instances details
Outputable ABExport 
Instance details

Defined in GHC.Hs.Binds

Methods

ppr :: ABExport -> SDoc #

data XXExprGhcTc #

Instances

Instances details
Outputable XXExprGhcTc 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: XXExprGhcTc -> SDoc #

data Specificity #

Instances

Instances details
Data Specificity 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Specificity -> c Specificity

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Specificity

toConstr :: Specificity -> Constr

dataTypeOf :: Specificity -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Specificity)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Specificity)

gmapT :: (forall b. Data b => b -> b) -> Specificity -> Specificity

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r

gmapQ :: (forall d. Data d => d -> u) -> Specificity -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Specificity -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity

Binary Specificity 
Instance details

Defined in GHC.Types.Var

Methods

put_ :: BinHandle -> Specificity -> IO ()

put :: BinHandle -> Specificity -> IO (Bin Specificity)

get :: BinHandle -> IO Specificity

Eq Specificity 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: Specificity -> Specificity -> Bool

(/=) :: Specificity -> Specificity -> Bool

Ord Specificity 
Instance details

Defined in GHC.Types.Var

OutputableBndrFlag Specificity p 
Instance details

Defined in GHC.Hs.Type

Outputable tv => Outputable (VarBndr tv Specificity) 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: VarBndr tv Specificity -> SDoc #

data SyntaxExprRn #

Instances

Instances details
Outputable SyntaxExprRn 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: SyntaxExprRn -> SDoc #

data EpAnnHsCase #

Instances

Instances details
Data EpAnnHsCase 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnnHsCase -> c EpAnnHsCase

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpAnnHsCase

toConstr :: EpAnnHsCase -> Constr

dataTypeOf :: EpAnnHsCase -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpAnnHsCase)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpAnnHsCase)

gmapT :: (forall b. Data b => b -> b) -> EpAnnHsCase -> EpAnnHsCase

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnHsCase -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnHsCase -> r

gmapQ :: (forall d. Data d => d -> u) -> EpAnnHsCase -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnnHsCase -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnnHsCase -> m EpAnnHsCase

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnHsCase -> m EpAnnHsCase

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnHsCase -> m EpAnnHsCase

data UniqSet a #

Instances

Instances details
Data a => Data (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniqSet a -> c (UniqSet a)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (UniqSet a)

toConstr :: UniqSet a -> Constr

dataTypeOf :: UniqSet a -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (UniqSet a))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (UniqSet a))

gmapT :: (forall b. Data b => b -> b) -> UniqSet a -> UniqSet a

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniqSet a -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniqSet a -> r

gmapQ :: (forall d. Data d => d -> u) -> UniqSet a -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniqSet a -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniqSet a -> m (UniqSet a)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniqSet a -> m (UniqSet a)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniqSet a -> m (UniqSet a)

Monoid (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

mempty :: UniqSet a

mappend :: UniqSet a -> UniqSet a -> UniqSet a

mconcat :: [UniqSet a] -> UniqSet a

Semigroup (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

(<>) :: UniqSet a -> UniqSet a -> UniqSet a

sconcat :: NonEmpty (UniqSet a) -> UniqSet a

stimes :: Integral b => b -> UniqSet a -> UniqSet a

Outputable a => Outputable (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

ppr :: UniqSet a -> SDoc #

Eq (UniqSet a) 
Instance details

Defined in GHC.Types.Unique.Set

Methods

(==) :: UniqSet a -> UniqSet a -> Bool

(/=) :: UniqSet a -> UniqSet a -> Bool

class (IsOutput doc, IsLine (Line doc)) => IsDoc doc where #

Minimal complete definition

line, ($$), dualDoc

Associated Types

type Line doc = (r :: Type) | r -> doc #

Methods

line :: Line doc -> doc #

($$) :: doc -> doc -> doc #

lines_ :: [Line doc] -> doc #

vcat :: [doc] -> doc #

dualDoc :: SDoc -> HDoc -> doc #

Instances

Instances details
IsDoc HDoc 
Instance details

Defined in GHC.Utils.Outputable

Associated Types

type Line HDoc = (r :: Type) #

Methods

line :: Line HDoc -> HDoc #

($$) :: HDoc -> HDoc -> HDoc #

lines_ :: [Line HDoc] -> HDoc #

vcat :: [HDoc] -> HDoc #

dualDoc :: SDoc -> HDoc -> HDoc #

IsDoc SDoc 
Instance details

Defined in GHC.Utils.Outputable

Associated Types

type Line SDoc = (r :: Type) #

Methods

line :: Line SDoc -> SDoc #

($$) :: SDoc -> SDoc -> SDoc #

lines_ :: [Line SDoc] -> SDoc #

vcat :: [SDoc] -> SDoc #

dualDoc :: SDoc -> HDoc -> SDoc #

class IsOutput doc where #

Methods

empty :: doc #

docWithContext :: (SDocContext -> doc) -> doc #

Instances

Instances details
IsOutput HDoc 
Instance details

Defined in GHC.Utils.Outputable

IsOutput HLine 
Instance details

Defined in GHC.Utils.Outputable

IsOutput SDoc 
Instance details

Defined in GHC.Utils.Outputable

class OutputableP env a where #

Methods

pdoc :: env -> a -> SDoc #

Instances

Instances details
OutputableP env Void 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Void -> SDoc #

OutputableP env Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

pdoc :: env -> Label -> SDoc #

OutputableP env Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

pdoc :: env -> Alignment -> SDoc #

OutputableP env SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> SDoc -> SDoc #

OutputableP env a => OutputableP env (SCC a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> SCC a -> SDoc #

OutputableP env a => OutputableP env (Set a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Set a -> SDoc #

OutputableP env a => OutputableP env (LabelMap a) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

pdoc :: env -> LabelMap a -> SDoc #

Outputable a => OutputableP env (PDoc a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> PDoc a -> SDoc #

OutputableP env a => OutputableP env (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Maybe a -> SDoc #

OutputableP env a => OutputableP env [a] 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> [a] -> SDoc #

(OutputableP env key, OutputableP env elt) => OutputableP env (Map key elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Map key elt -> SDoc #

(OutputableP env a, OutputableP env b) => OutputableP env (a, b) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> (a, b) -> SDoc #

(OutputableP env a, OutputableP env b, OutputableP env c) => OutputableP env (a, b, c) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> (a, b, c) -> SDoc #

type family Line doc = (r :: Type) | r -> doc #

Instances

Instances details
type Line HDoc 
Instance details

Defined in GHC.Utils.Outputable

type Line HDoc = HLine
type Line SDoc 
Instance details

Defined in GHC.Utils.Outputable

type Line SDoc = SDoc

data Depth #

Constructors

AllTheWay 
PartWay Int 
DefaultDepth 

data HDoc #

Instances

Instances details
IsDoc HDoc 
Instance details

Defined in GHC.Utils.Outputable

Associated Types

type Line HDoc = (r :: Type) #

Methods

line :: Line HDoc -> HDoc #

($$) :: HDoc -> HDoc -> HDoc #

lines_ :: [Line HDoc] -> HDoc #

vcat :: [HDoc] -> HDoc #

dualDoc :: SDoc -> HDoc -> HDoc #

IsOutput HDoc 
Instance details

Defined in GHC.Utils.Outputable

type Line HDoc 
Instance details

Defined in GHC.Utils.Outputable

type Line HDoc = HLine

newtype IsEmptyOrSingleton #

Constructors

IsEmptyOrSingleton Bool 

newtype PDoc a #

Constructors

PDoc a 

Instances

Instances details
Outputable a => OutputableP env (PDoc a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> PDoc a -> SDoc #

data QualifyName #

Instances

Instances details
Outputable QualifyName 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: QualifyName -> SDoc #

type QueryQualifyModule = Module -> Bool #

type QueryQualifyPackage = Unit -> Bool #

data InlinePragma #

Constructors

InlinePragma 

Fields

Instances

Instances details
Data InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InlinePragma -> c InlinePragma

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InlinePragma

toConstr :: InlinePragma -> Constr

dataTypeOf :: InlinePragma -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InlinePragma)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InlinePragma)

gmapT :: (forall b. Data b => b -> b) -> InlinePragma -> InlinePragma

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InlinePragma -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InlinePragma -> r

gmapQ :: (forall d. Data d => d -> u) -> InlinePragma -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> InlinePragma -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma

Binary InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> InlinePragma -> IO ()

put :: BinHandle -> InlinePragma -> IO (Bin InlinePragma)

get :: BinHandle -> IO InlinePragma

Outputable InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: InlinePragma -> SDoc #

Eq InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InlinePragma -> InlinePragma -> Bool

(/=) :: InlinePragma -> InlinePragma -> Bool

data AnnSig #

Constructors

AnnSig 

Fields

Instances

Instances details
Data AnnSig 
Instance details

Defined in GHC.Hs.Binds

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnSig -> c AnnSig

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnSig

toConstr :: AnnSig -> Constr

dataTypeOf :: AnnSig -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnSig)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnSig)

gmapT :: (forall b. Data b => b -> b) -> AnnSig -> AnnSig

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnSig -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnSig -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnSig -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnSig -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnSig -> m AnnSig

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSig -> m AnnSig

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSig -> m AnnSig

newtype IdSig #

Constructors

IdSig 

Fields

Instances

Instances details
Data IdSig 
Instance details

Defined in GHC.Hs.Binds

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IdSig -> c IdSig

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IdSig

toConstr :: IdSig -> Constr

dataTypeOf :: IdSig -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IdSig)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IdSig)

gmapT :: (forall b. Data b => b -> b) -> IdSig -> IdSig

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IdSig -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IdSig -> r

gmapQ :: (forall d. Data d => d -> u) -> IdSig -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> IdSig -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IdSig -> m IdSig

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IdSig -> m IdSig

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IdSig -> m IdSig

data TcSpecPrag #

Instances

Instances details
Data TcSpecPrag 
Instance details

Defined in GHC.Hs.Binds

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TcSpecPrag -> c TcSpecPrag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TcSpecPrag

toConstr :: TcSpecPrag -> Constr

dataTypeOf :: TcSpecPrag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TcSpecPrag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TcSpecPrag)

gmapT :: (forall b. Data b => b -> b) -> TcSpecPrag -> TcSpecPrag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TcSpecPrag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TcSpecPrag -> r

gmapQ :: (forall d. Data d => d -> u) -> TcSpecPrag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TcSpecPrag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TcSpecPrag -> m TcSpecPrag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TcSpecPrag -> m TcSpecPrag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TcSpecPrag -> m TcSpecPrag

Outputable TcSpecPrag 
Instance details

Defined in GHC.Hs.Binds

Methods

ppr :: TcSpecPrag -> SDoc #

data TcSpecPrags #

Instances

Instances details
Data TcSpecPrags 
Instance details

Defined in GHC.Hs.Binds

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TcSpecPrags -> c TcSpecPrags

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TcSpecPrags

toConstr :: TcSpecPrags -> Constr

dataTypeOf :: TcSpecPrags -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TcSpecPrags)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TcSpecPrags)

gmapT :: (forall b. Data b => b -> b) -> TcSpecPrags -> TcSpecPrags

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TcSpecPrags -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TcSpecPrags -> r

gmapQ :: (forall d. Data d => d -> u) -> TcSpecPrags -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TcSpecPrags -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TcSpecPrags -> m TcSpecPrags

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TcSpecPrags -> m TcSpecPrags

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TcSpecPrags -> m TcSpecPrags

data NHsValBindsLR idL #

Constructors

NValBinds [(RecFlag, LHsBinds idL)] [LSig GhcRn] 

data InlineSpec #

Constructors

Inline SourceText 
Inlinable SourceText 
NoInline SourceText 
Opaque SourceText 
NoUserInlinePrag 

Instances

Instances details
Data InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InlineSpec -> c InlineSpec

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InlineSpec

toConstr :: InlineSpec -> Constr

dataTypeOf :: InlineSpec -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InlineSpec)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InlineSpec)

gmapT :: (forall b. Data b => b -> b) -> InlineSpec -> InlineSpec

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InlineSpec -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InlineSpec -> r

gmapQ :: (forall d. Data d => d -> u) -> InlineSpec -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> InlineSpec -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec

Show InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> InlineSpec -> ShowS

show :: InlineSpec -> String

showList :: [InlineSpec] -> ShowS

Binary InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> InlineSpec -> IO ()

put :: BinHandle -> InlineSpec -> IO (Bin InlineSpec)

get :: BinHandle -> IO InlineSpec

Outputable InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: InlineSpec -> SDoc #

Eq InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InlineSpec -> InlineSpec -> Bool

(/=) :: InlineSpec -> InlineSpec -> Bool

type Arity = Int #

data Activation #

Instances

Instances details
Data Activation 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Activation -> c Activation

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Activation

toConstr :: Activation -> Constr

dataTypeOf :: Activation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Activation)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Activation)

gmapT :: (forall b. Data b => b -> b) -> Activation -> Activation

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Activation -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Activation -> r

gmapQ :: (forall d. Data d => d -> u) -> Activation -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Activation -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Activation -> m Activation

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation -> m Activation

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation -> m Activation

Binary Activation 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> Activation -> IO ()

put :: BinHandle -> Activation -> IO (Bin Activation)

get :: BinHandle -> IO Activation

Outputable Activation 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Activation -> SDoc #

Eq Activation 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Activation -> Activation -> Bool

(/=) :: Activation -> Activation -> Bool

data RuleMatchInfo #

Constructors

ConLike 
FunLike 

Instances

Instances details
Data RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleMatchInfo -> c RuleMatchInfo

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleMatchInfo

toConstr :: RuleMatchInfo -> Constr

dataTypeOf :: RuleMatchInfo -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleMatchInfo)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleMatchInfo)

gmapT :: (forall b. Data b => b -> b) -> RuleMatchInfo -> RuleMatchInfo

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatchInfo -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatchInfo -> r

gmapQ :: (forall d. Data d => d -> u) -> RuleMatchInfo -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleMatchInfo -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo

Show RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> RuleMatchInfo -> ShowS

show :: RuleMatchInfo -> String

showList :: [RuleMatchInfo] -> ShowS

Binary RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> RuleMatchInfo -> IO ()

put :: BinHandle -> RuleMatchInfo -> IO (Bin RuleMatchInfo)

get :: BinHandle -> IO RuleMatchInfo

Outputable RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: RuleMatchInfo -> SDoc #

Eq RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

type ConTag = Int #

data CbvMark #

Constructors

MarkedCbv 
NotMarkedCbv 

Instances

Instances details
Binary CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> CbvMark -> IO ()

put :: BinHandle -> CbvMark -> IO (Bin CbvMark)

get :: BinHandle -> IO CbvMark

Outputable CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: CbvMark -> SDoc #

Eq CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: CbvMark -> CbvMark -> Bool

(/=) :: CbvMark -> CbvMark -> Bool

data FunctionOrData #

Constructors

IsFunction 
IsData 

Instances

Instances details
Data FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunctionOrData -> c FunctionOrData

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunctionOrData

toConstr :: FunctionOrData -> Constr

dataTypeOf :: FunctionOrData -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunctionOrData)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunctionOrData)

gmapT :: (forall b. Data b => b -> b) -> FunctionOrData -> FunctionOrData

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunctionOrData -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunctionOrData -> r

gmapQ :: (forall d. Data d => d -> u) -> FunctionOrData -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunctionOrData -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData

Binary FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> FunctionOrData -> IO ()

put :: BinHandle -> FunctionOrData -> IO (Bin FunctionOrData)

get :: BinHandle -> IO FunctionOrData

Outputable FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: FunctionOrData -> SDoc #

Eq FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Ord FunctionOrData 
Instance details

Defined in GHC.Types.Basic

data LeftOrRight #

Constructors

CLeft 
CRight 

Instances

Instances details
Data LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LeftOrRight -> c LeftOrRight

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LeftOrRight

toConstr :: LeftOrRight -> Constr

dataTypeOf :: LeftOrRight -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LeftOrRight)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LeftOrRight)

gmapT :: (forall b. Data b => b -> b) -> LeftOrRight -> LeftOrRight

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LeftOrRight -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LeftOrRight -> r

gmapQ :: (forall d. Data d => d -> u) -> LeftOrRight -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> LeftOrRight -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight

Binary LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> LeftOrRight -> IO ()

put :: BinHandle -> LeftOrRight -> IO (Bin LeftOrRight)

get :: BinHandle -> IO LeftOrRight

Outputable LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: LeftOrRight -> SDoc #

Eq LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: LeftOrRight -> LeftOrRight -> Bool

(/=) :: LeftOrRight -> LeftOrRight -> Bool

data OverlapMode #

Constructors

NoOverlap SourceText 
Overlappable SourceText 
Overlapping SourceText 
Overlaps SourceText 
Incoherent SourceText 

Instances

Instances details
Data OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverlapMode -> c OverlapMode

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverlapMode

toConstr :: OverlapMode -> Constr

dataTypeOf :: OverlapMode -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverlapMode)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverlapMode)

gmapT :: (forall b. Data b => b -> b) -> OverlapMode -> OverlapMode

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverlapMode -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverlapMode -> r

gmapQ :: (forall d. Data d => d -> u) -> OverlapMode -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverlapMode -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode

Binary OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> OverlapMode -> IO ()

put :: BinHandle -> OverlapMode -> IO (Bin OverlapMode)

get :: BinHandle -> IO OverlapMode

Outputable OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OverlapMode -> SDoc #

Eq OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OverlapMode -> OverlapMode -> Bool

(/=) :: OverlapMode -> OverlapMode -> Bool

type Anno OverlapMode 
Instance details

Defined in GHC.Hs.Decls

type Anno OverlapMode 
Instance details

Defined in GHC.Hs.Decls

data TupleSort #

Instances

Instances details
Data TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TupleSort -> c TupleSort

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TupleSort

toConstr :: TupleSort -> Constr

dataTypeOf :: TupleSort -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TupleSort)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TupleSort)

gmapT :: (forall b. Data b => b -> b) -> TupleSort -> TupleSort

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TupleSort -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TupleSort -> r

gmapQ :: (forall d. Data d => d -> u) -> TupleSort -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TupleSort -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort

Binary TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> TupleSort -> IO ()

put :: BinHandle -> TupleSort -> IO (Bin TupleSort)

get :: BinHandle -> IO TupleSort

Outputable TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TupleSort -> SDoc #

Eq TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TupleSort -> TupleSort -> Bool

(/=) :: TupleSort -> TupleSort -> Bool

data UnfoldingSource #

Instances

Instances details
Binary UnfoldingSource 
Instance details

Defined in GHC.Types.Basic

Methods

put_ :: BinHandle -> UnfoldingSource -> IO ()

put :: BinHandle -> UnfoldingSource -> IO (Bin UnfoldingSource)

get :: BinHandle -> IO UnfoldingSource

Outputable UnfoldingSource 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: UnfoldingSource -> SDoc #

data TypeOrConstraint #

Constructors

TypeLike 
ConstraintLike 

Instances

Instances details
Data TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeOrConstraint -> c TypeOrConstraint

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeOrConstraint

toConstr :: TypeOrConstraint -> Constr

dataTypeOf :: TypeOrConstraint -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeOrConstraint)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeOrConstraint)

gmapT :: (forall b. Data b => b -> b) -> TypeOrConstraint -> TypeOrConstraint

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrConstraint -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrConstraint -> r

gmapQ :: (forall d. Data d => d -> u) -> TypeOrConstraint -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeOrConstraint -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint

Eq TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Ord TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

data Alignment #

Instances

Instances details
Outputable Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: Alignment -> SDoc #

Eq Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Alignment -> Alignment -> Bool

(/=) :: Alignment -> Alignment -> Bool

Ord Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: Alignment -> Alignment -> Ordering

(<) :: Alignment -> Alignment -> Bool

(<=) :: Alignment -> Alignment -> Bool

(>) :: Alignment -> Alignment -> Bool

(>=) :: Alignment -> Alignment -> Bool

max :: Alignment -> Alignment -> Alignment

min :: Alignment -> Alignment -> Alignment

OutputableP env Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

pdoc :: env -> Alignment -> SDoc #

data CompilerPhase #

Instances

Instances details
Outputable CompilerPhase 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: CompilerPhase -> SDoc #

Eq CompilerPhase 
Instance details

Defined in GHC.Types.Basic

data InsideLam #

Constructors

IsInsideLam 
NotInsideLam 

Instances

Instances details
Monoid InsideLam 
Instance details

Defined in GHC.Types.Basic

Semigroup InsideLam 
Instance details

Defined in GHC.Types.Basic

Methods

(<>) :: InsideLam -> InsideLam -> InsideLam

sconcat :: NonEmpty InsideLam -> InsideLam

stimes :: Integral b => b -> InsideLam -> InsideLam

Eq InsideLam 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InsideLam -> InsideLam -> Bool

(/=) :: InsideLam -> InsideLam -> Bool

data IntWithInf #

Instances

Instances details
Num IntWithInf 
Instance details

Defined in GHC.Types.Basic

Outputable IntWithInf 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: IntWithInf -> SDoc #

Eq IntWithInf 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: IntWithInf -> IntWithInf -> Bool

(/=) :: IntWithInf -> IntWithInf -> Bool

Ord IntWithInf 
Instance details

Defined in GHC.Types.Basic

data InterestingCxt #

Instances

Instances details
Monoid InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Semigroup InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Eq InterestingCxt 
Instance details

Defined in GHC.Types.Basic

data OccInfo #

Instances

Instances details
Outputable OccInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OccInfo -> SDoc #

Eq OccInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OccInfo -> OccInfo -> Bool

(/=) :: OccInfo -> OccInfo -> Bool

data OneShotInfo #

Constructors

NoOneShotInfo 
OneShotLam 

Instances

Instances details
Outputable OneShotInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: OneShotInfo -> SDoc #

Eq OneShotInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OneShotInfo -> OneShotInfo -> Bool

(/=) :: OneShotInfo -> OneShotInfo -> Bool

newtype PprPrec #

Constructors

PprPrec Int 

Instances

Instances details
Show PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> PprPrec -> ShowS

show :: PprPrec -> String

showList :: [PprPrec] -> ShowS

Eq PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: PprPrec -> PprPrec -> Bool

(/=) :: PprPrec -> PprPrec -> Bool

Ord PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: PprPrec -> PprPrec -> Ordering

(<) :: PprPrec -> PprPrec -> Bool

(<=) :: PprPrec -> PprPrec -> Bool

(>) :: PprPrec -> PprPrec -> Bool

(>=) :: PprPrec -> PprPrec -> Bool

max :: PprPrec -> PprPrec -> PprPrec

min :: PprPrec -> PprPrec -> PprPrec

data TailCallInfo #

Instances

Instances details
Outputable TailCallInfo 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: TailCallInfo -> SDoc #

Eq TailCallInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TailCallInfo -> TailCallInfo -> Bool

(/=) :: TailCallInfo -> TailCallInfo -> Bool

data UnboxedTupleOrSum #

Instances

Instances details
Outputable UnboxedTupleOrSum 
Instance details

Defined in GHC.Types.Basic

Eq UnboxedTupleOrSum 
Instance details

Defined in GHC.Types.Basic

data DefMethSpec ty #

Constructors

VanillaDM 
GenericDM ty 

Instances

Instances details
Binary (DefMethSpec IfaceType) 
Instance details

Defined in GHC.Iface.Type

Methods

put_ :: BinHandle -> DefMethSpec IfaceType -> IO ()

put :: BinHandle -> DefMethSpec IfaceType -> IO (Bin (DefMethSpec IfaceType))

get :: BinHandle -> IO (DefMethSpec IfaceType)

Outputable (DefMethSpec ty) 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: DefMethSpec ty -> SDoc #

data SuccessFlag #

Constructors

Succeeded 
Failed 

Instances

Instances details
Semigroup SuccessFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(<>) :: SuccessFlag -> SuccessFlag -> SuccessFlag

sconcat :: NonEmpty SuccessFlag -> SuccessFlag

stimes :: Integral b => b -> SuccessFlag -> SuccessFlag

Outputable SuccessFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: SuccessFlag -> SDoc #

data SwapFlag #

Constructors

NotSwapped 
IsSwapped 

Instances

Instances details
Outputable SwapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

ppr :: SwapFlag -> SDoc #

type BranchCount = Int #

type ConTagZ = Int #

data EP a #

Constructors

EP 

Fields

type FullArgCount = Int #

type JoinArity = Int #

type PhaseNum = Int #

type RepArity = Int #

type DNameEnv a = UniqDFM Name a #

data PrimRep #

Instances

Instances details
Data PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrimRep -> c PrimRep

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrimRep

toConstr :: PrimRep -> Constr

dataTypeOf :: PrimRep -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrimRep)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrimRep)

gmapT :: (forall b. Data b => b -> b) -> PrimRep -> PrimRep

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrimRep -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrimRep -> r

gmapQ :: (forall d. Data d => d -> u) -> PrimRep -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrimRep -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrimRep -> m PrimRep

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimRep -> m PrimRep

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimRep -> m PrimRep

Show PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

showsPrec :: Int -> PrimRep -> ShowS

show :: PrimRep -> String

showList :: [PrimRep] -> ShowS

Binary PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

put_ :: BinHandle -> PrimRep -> IO ()

put :: BinHandle -> PrimRep -> IO (Bin PrimRep)

get :: BinHandle -> IO PrimRep

Outputable PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: PrimRep -> SDoc #

Eq PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: PrimRep -> PrimRep -> Bool

(/=) :: PrimRep -> PrimRep -> Bool

Ord PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

compare :: PrimRep -> PrimRep -> Ordering

(<) :: PrimRep -> PrimRep -> Bool

(<=) :: PrimRep -> PrimRep -> Bool

(>) :: PrimRep -> PrimRep -> Bool

(>=) :: PrimRep -> PrimRep -> Bool

max :: PrimRep -> PrimRep -> PrimRep

min :: PrimRep -> PrimRep -> PrimRep

data BoxingInfo b #

Constructors

BI_NoBoxNeeded 
BI_NoBoxAvailable 
BI_Box 

Fields

data TyConBndrVis #

Instances

Instances details
Binary TyConBndrVis 
Instance details

Defined in GHC.Core.TyCon

Methods

put_ :: BinHandle -> TyConBndrVis -> IO ()

put :: BinHandle -> TyConBndrVis -> IO (Bin TyConBndrVis)

get :: BinHandle -> IO TyConBndrVis

Outputable TyConBndrVis 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: TyConBndrVis -> SDoc #

OutputableBndr tv => Outputable (VarBndr tv TyConBndrVis) 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: VarBndr tv TyConBndrVis -> SDoc #

data ForAllTyFlag #

Bundled Patterns

pattern Inferred :: ForAllTyFlag 
pattern Specified :: ForAllTyFlag 

Instances

Instances details
Data ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForAllTyFlag -> c ForAllTyFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForAllTyFlag

toConstr :: ForAllTyFlag -> Constr

dataTypeOf :: ForAllTyFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForAllTyFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForAllTyFlag)

gmapT :: (forall b. Data b => b -> b) -> ForAllTyFlag -> ForAllTyFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForAllTyFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForAllTyFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> ForAllTyFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForAllTyFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag

Binary ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

put_ :: BinHandle -> ForAllTyFlag -> IO ()

put :: BinHandle -> ForAllTyFlag -> IO (Bin ForAllTyFlag)

get :: BinHandle -> IO ForAllTyFlag

Outputable ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: ForAllTyFlag -> SDoc #

Eq ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: ForAllTyFlag -> ForAllTyFlag -> Bool

(/=) :: ForAllTyFlag -> ForAllTyFlag -> Bool

Ord ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Outputable tv => Outputable (VarBndr tv ForAllTyFlag) 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: VarBndr tv ForAllTyFlag -> SDoc #

data FunTyFlag #

Constructors

FTF_T_T 
FTF_T_C 
FTF_C_T 
FTF_C_C 

Instances

Instances details
Data FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunTyFlag -> c FunTyFlag

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunTyFlag

toConstr :: FunTyFlag -> Constr

dataTypeOf :: FunTyFlag -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunTyFlag)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunTyFlag)

gmapT :: (forall b. Data b => b -> b) -> FunTyFlag -> FunTyFlag

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunTyFlag -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunTyFlag -> r

gmapQ :: (forall d. Data d => d -> u) -> FunTyFlag -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunTyFlag -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag

Binary FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

put_ :: BinHandle -> FunTyFlag -> IO ()

put :: BinHandle -> FunTyFlag -> IO (Bin FunTyFlag)

get :: BinHandle -> IO FunTyFlag

Outputable FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: FunTyFlag -> SDoc #

Eq FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: FunTyFlag -> FunTyFlag -> Bool

(/=) :: FunTyFlag -> FunTyFlag -> Bool

Ord FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

compare :: FunTyFlag -> FunTyFlag -> Ordering

(<) :: FunTyFlag -> FunTyFlag -> Bool

(<=) :: FunTyFlag -> FunTyFlag -> Bool

(>) :: FunTyFlag -> FunTyFlag -> Bool

(>=) :: FunTyFlag -> FunTyFlag -> Bool

max :: FunTyFlag -> FunTyFlag -> FunTyFlag

min :: FunTyFlag -> FunTyFlag -> FunTyFlag

data PiTyBinder #

Instances

Instances details
Data PiTyBinder 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PiTyBinder -> c PiTyBinder

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PiTyBinder

toConstr :: PiTyBinder -> Constr

dataTypeOf :: PiTyBinder -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PiTyBinder)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PiTyBinder)

gmapT :: (forall b. Data b => b -> b) -> PiTyBinder -> PiTyBinder

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PiTyBinder -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PiTyBinder -> r

gmapQ :: (forall d. Data d => d -> u) -> PiTyBinder -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PiTyBinder -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder

Outputable PiTyBinder 
Instance details

Defined in GHC.Types.Var

Methods

ppr :: PiTyBinder -> SDoc #

data Role #

Instances

Instances details
Data Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Role -> c Role

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Role

toConstr :: Role -> Constr

dataTypeOf :: Role -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Role)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Role)

gmapT :: (forall b. Data b => b -> b) -> Role -> Role

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r

gmapQ :: (forall d. Data d => d -> u) -> Role -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Role -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Role -> m Role

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role

Eq Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Role -> Role -> Bool

(/=) :: Role -> Role -> Bool

Ord Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

compare :: Role -> Role -> Ordering

(<) :: Role -> Role -> Bool

(<=) :: Role -> Role -> Bool

(>) :: Role -> Role -> Bool

(>=) :: Role -> Role -> Bool

max :: Role -> Role -> Role

min :: Role -> Role -> Role

type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns
type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns

data CoSel #

Constructors

SelTyCon Int Role 
SelFun FunSel 
SelForAll 

Instances

Instances details
Data CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CoSel -> c CoSel

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CoSel

toConstr :: CoSel -> Constr

dataTypeOf :: CoSel -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CoSel)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CoSel)

gmapT :: (forall b. Data b => b -> b) -> CoSel -> CoSel

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CoSel -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CoSel -> r

gmapQ :: (forall d. Data d => d -> u) -> CoSel -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> CoSel -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CoSel -> m CoSel

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CoSel -> m CoSel

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CoSel -> m CoSel

NFData CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

rnf :: CoSel -> ()

Binary CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

put_ :: BinHandle -> CoSel -> IO ()

put :: BinHandle -> CoSel -> IO (Bin CoSel)

get :: BinHandle -> IO CoSel

Outputable CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: CoSel -> SDoc #

Eq CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: CoSel -> CoSel -> Bool

(/=) :: CoSel -> CoSel -> Bool

data Coercion #

Instances

Instances details
Data Coercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Coercion -> c Coercion

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Coercion

toConstr :: Coercion -> Constr

dataTypeOf :: Coercion -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Coercion)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Coercion)

gmapT :: (forall b. Data b => b -> b) -> Coercion -> Coercion

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Coercion -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Coercion -> r

gmapQ :: (forall d. Data d => d -> u) -> Coercion -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Coercion -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Coercion -> m Coercion

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion -> m Coercion

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion -> m Coercion

Outputable Coercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: Coercion -> SDoc #

Eq (DeBruijn Coercion) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Coercion -> DeBruijn Coercion -> Bool

(/=) :: DeBruijn Coercion -> DeBruijn Coercion -> Bool

data FunSel #

Constructors

SelMult 
SelArg 
SelRes 

Instances

Instances details
Data FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunSel -> c FunSel

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunSel

toConstr :: FunSel -> Constr

dataTypeOf :: FunSel -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunSel)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunSel)

gmapT :: (forall b. Data b => b -> b) -> FunSel -> FunSel

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunSel -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunSel -> r

gmapQ :: (forall d. Data d => d -> u) -> FunSel -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunSel -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunSel -> m FunSel

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunSel -> m FunSel

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunSel -> m FunSel

Outputable FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: FunSel -> SDoc #

Eq FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: FunSel -> FunSel -> Bool

(/=) :: FunSel -> FunSel -> Bool

data MCoercion #

Constructors

MRefl 
MCo Coercion 

Instances

Instances details
Data MCoercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MCoercion -> c MCoercion

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MCoercion

toConstr :: MCoercion -> Constr

dataTypeOf :: MCoercion -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MCoercion)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MCoercion)

gmapT :: (forall b. Data b => b -> b) -> MCoercion -> MCoercion

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MCoercion -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MCoercion -> r

gmapQ :: (forall d. Data d => d -> u) -> MCoercion -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> MCoercion -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MCoercion -> m MCoercion

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MCoercion -> m MCoercion

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MCoercion -> m MCoercion

Outputable MCoercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: MCoercion -> SDoc #

data TyLit #

Constructors

NumTyLit Integer 
StrTyLit FastString 
CharTyLit Char 

Instances

Instances details
Data TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyLit -> c TyLit

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TyLit

toConstr :: TyLit -> Constr

dataTypeOf :: TyLit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TyLit)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TyLit)

gmapT :: (forall b. Data b => b -> b) -> TyLit -> TyLit

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r

gmapQ :: (forall d. Data d => d -> u) -> TyLit -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyLit -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit

Outputable TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: TyLit -> SDoc #

Eq TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: TyLit -> TyLit -> Bool

(/=) :: TyLit -> TyLit -> Bool

data UnivCoProvenance #

Instances

Instances details
Data UnivCoProvenance 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnivCoProvenance -> c UnivCoProvenance

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnivCoProvenance

toConstr :: UnivCoProvenance -> Constr

dataTypeOf :: UnivCoProvenance -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnivCoProvenance)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnivCoProvenance)

gmapT :: (forall b. Data b => b -> b) -> UnivCoProvenance -> UnivCoProvenance

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnivCoProvenance -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnivCoProvenance -> r

gmapQ :: (forall d. Data d => d -> u) -> UnivCoProvenance -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnivCoProvenance -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnivCoProvenance -> m UnivCoProvenance

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnivCoProvenance -> m UnivCoProvenance

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnivCoProvenance -> m UnivCoProvenance

Outputable UnivCoProvenance 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

ppr :: UnivCoProvenance -> SDoc #

type FRRType = Type #

type KnotTied ty = ty #

data TyCoFolder env a #

Constructors

TyCoFolder 

Fields

data HoleExprRef #

Constructors

HER (IORef EvTerm) TcType Unique 

Instances

Instances details
Data HoleExprRef 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HoleExprRef -> c HoleExprRef

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HoleExprRef

toConstr :: HoleExprRef -> Constr

dataTypeOf :: HoleExprRef -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HoleExprRef)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HoleExprRef)

gmapT :: (forall b. Data b => b -> b) -> HoleExprRef -> HoleExprRef

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HoleExprRef -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HoleExprRef -> r

gmapQ :: (forall d. Data d => d -> u) -> HoleExprRef -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HoleExprRef -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HoleExprRef -> m HoleExprRef

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HoleExprRef -> m HoleExprRef

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HoleExprRef -> m HoleExprRef

Outputable HoleExprRef 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: HoleExprRef -> SDoc #

type TcKind = Kind #

type TcTyCoVar = Var #

type TcTyCoVarSet = TyCoVarSet #

data TcTyVarDetails #

Instances

Instances details
Outputable TcTyVarDetails 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: TcTyVarDetails -> SDoc #

data HasGivenEqs #

Instances

Instances details
Monoid HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Semigroup HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(<>) :: HasGivenEqs -> HasGivenEqs -> HasGivenEqs

sconcat :: NonEmpty HasGivenEqs -> HasGivenEqs

stimes :: Integral b => b -> HasGivenEqs -> HasGivenEqs

Outputable HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: HasGivenEqs -> SDoc #

Eq HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: HasGivenEqs -> HasGivenEqs -> Bool

(/=) :: HasGivenEqs -> HasGivenEqs -> Bool

data SubGoalDepth #

Instances

Instances details
Outputable SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: SubGoalDepth -> SDoc #

Eq SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: SubGoalDepth -> SubGoalDepth -> Bool

(/=) :: SubGoalDepth -> SubGoalDepth -> Bool

Ord SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

data CanEqLHS #

Constructors

TyVarLHS TcTyVar 
TyFamLHS TyCon [Xi] 

Instances

Instances details
Outputable CanEqLHS 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: CanEqLHS -> SDoc #

data HoleSort #

Instances

Instances details
Outputable HoleSort 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: HoleSort -> SDoc #

data ImplicStatus #

Constructors

IC_Solved 

Fields

IC_Insoluble 
IC_BadTelescope 
IC_Unsolved 

Instances

Instances details
Outputable ImplicStatus 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: ImplicStatus -> SDoc #

data QCInst #

Constructors

QCI 

Instances

Instances details
Outputable QCInst 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: QCInst -> SDoc #

data TcEvDest #

Constructors

EvVarDest EvVar 
HoleDest CoercionHole 

Instances

Instances details
Outputable TcEvDest 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

ppr :: TcEvDest -> SDoc #

type CtFlavourRole = (CtFlavour, EqRel) #

type Xi = TcType #

data FloatBind #

Constructors

FloatLet CoreBind 
FloatCase CoreExpr Id AltCon [Var] 

Instances

Instances details
Outputable FloatBind 
Instance details

Defined in GHC.Core.Make

Methods

ppr :: FloatBind -> SDoc #

type DFunId = Id #

data EvCallStack #

Instances

Instances details
Data EvCallStack 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EvCallStack -> c EvCallStack

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EvCallStack

toConstr :: EvCallStack -> Constr

dataTypeOf :: EvCallStack -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EvCallStack)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EvCallStack)

gmapT :: (forall b. Data b => b -> b) -> EvCallStack -> EvCallStack

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EvCallStack -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EvCallStack -> r

gmapQ :: (forall d. Data d => d -> u) -> EvCallStack -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EvCallStack -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EvCallStack -> m EvCallStack

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EvCallStack -> m EvCallStack

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EvCallStack -> m EvCallStack

Outputable EvCallStack 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvCallStack -> SDoc #

data EvTypeable #

Instances

Instances details
Data EvTypeable 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EvTypeable -> c EvTypeable

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EvTypeable

toConstr :: EvTypeable -> Constr

dataTypeOf :: EvTypeable -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EvTypeable)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EvTypeable)

gmapT :: (forall b. Data b => b -> b) -> EvTypeable -> EvTypeable

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EvTypeable -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EvTypeable -> r

gmapQ :: (forall d. Data d => d -> u) -> EvTypeable -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EvTypeable -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EvTypeable -> m EvTypeable

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EvTypeable -> m EvTypeable

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EvTypeable -> m EvTypeable

Outputable EvTypeable 
Instance details

Defined in GHC.Tc.Types.Evidence

Methods

ppr :: EvTypeable -> SDoc #

type IdUnfoldingFun = Id -> Unfolding #

type JoinId = Id #

type InId = Id #

type InVar = Var #

type OutId = Id #

type OutVar = Var #

type DFunInstType = Maybe Type #

type VisibleOrphanModules = ModuleSet #

data ATValidityInfo #

Constructors

NoATVI 
ATVI SrcSpan [Type] 

data ClassATItem #

Constructors

ATI TyCon (Maybe (Type, ATValidityInfo)) 

type ClassMinimalDef = BooleanFormula Name #

data Subst #

Constructors

Subst InScopeSet IdSubstEnv TvSubstEnv CvSubstEnv 

Instances

Instances details
Outputable Subst 
Instance details

Defined in GHC.Core.TyCo.Subst

Methods

ppr :: Subst -> SDoc #

type TvSubstEnv = TyVarEnv Type #

data SkolemInfo #

Instances

Instances details
Uniquable SkolemInfo 
Instance details

Defined in GHC.Tc.Types.Origin

Outputable SkolemInfo 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: SkolemInfo -> SDoc #

data IllegalForeignTypeReason #

Instances

Instances details
Generic IllegalForeignTypeReason 
Instance details

Defined in GHC.Tc.Utils.TcType

Associated Types

type Rep IllegalForeignTypeReason :: Type -> Type

type Rep IllegalForeignTypeReason 
Instance details

Defined in GHC.Tc.Utils.TcType

type Rep IllegalForeignTypeReason = D1 ('MetaData "IllegalForeignTypeReason" "GHC.Tc.Utils.TcType" "ghc" 'False) (((C1 ('MetaCons "TypeCannotBeMarshaled" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeCannotBeMarshaledReason)) :+: C1 ('MetaCons "ForeignDynNotPtr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Type))) :+: (C1 ('MetaCons "SafeHaskellMustBeInIO" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IOResultExpected" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UnexpectedNestedForall" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LinearTypesNotAllowed" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OneArgExpected" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AtLeastOneArgExpected" 'PrefixI 'False) (U1 :: Type -> Type))))

data TypeCannotBeMarshaledReason #

Instances

Instances details
Generic TypeCannotBeMarshaledReason 
Instance details

Defined in GHC.Tc.Utils.TcType

Associated Types

type Rep TypeCannotBeMarshaledReason :: Type -> Type

type Rep TypeCannotBeMarshaledReason 
Instance details

Defined in GHC.Tc.Utils.TcType

type Rep TypeCannotBeMarshaledReason = D1 ('MetaData "TypeCannotBeMarshaledReason" "GHC.Tc.Utils.TcType" "ghc" 'False) ((C1 ('MetaCons "NotADataType" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NewtypeDataConNotInScope" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TyCon))) :+: C1 ('MetaCons "UnliftedFFITypesNeeded" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NotABoxedMarshalableTyCon" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ForeignLabelNotAPtr" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NotSimpleUnliftedType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotBoxedKindAny" 'PrefixI 'False) (U1 :: Type -> Type))))

data InferResult #

Constructors

IR 

Instances

Instances details
Outputable InferResult 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: InferResult -> SDoc #

data MetaDetails #

Constructors

Flexi 
Indirect TcType 

Instances

Instances details
Outputable MetaDetails 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: MetaDetails -> SDoc #

data MetaInfo #

Instances

Instances details
Outputable MetaInfo 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: MetaInfo -> SDoc #

data PatersonSize #

Constructors

PS_TyFam TyCon 
PS_Vanilla 

Fields

Instances

Instances details
Outputable PatersonSize 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

ppr :: PatersonSize -> SDoc #

type TcCoVar = CoVar #

type TcDTyCoVarSet = DTyCoVarSet #

type TcDTyVarSet = DTyVarSet #

type TcInvisTVBinder = InvisTVBinder #

type TcReqTVBinder = ReqTVBinder #

type TcTyVarSet = TyVarSet #

type IdSubstEnv = IdEnv CoreExpr #

data TyCoMapper env (m :: Type -> Type) #

Constructors

TyCoMapper 

Fields

data Injectivity #

Constructors

NotInjective 
Injective [Bool] 

Instances

Instances details
Binary Injectivity 
Instance details

Defined in GHC.Core.TyCon

Methods

put_ :: BinHandle -> Injectivity -> IO ()

put :: BinHandle -> Injectivity -> IO (Bin Injectivity)

get :: BinHandle -> IO Injectivity

Eq Injectivity 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: Injectivity -> Injectivity -> Bool

(/=) :: Injectivity -> Injectivity -> Bool

data PrimElemRep #

Instances

Instances details
Data PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrimElemRep -> c PrimElemRep

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrimElemRep

toConstr :: PrimElemRep -> Constr

dataTypeOf :: PrimElemRep -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrimElemRep)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrimElemRep)

gmapT :: (forall b. Data b => b -> b) -> PrimElemRep -> PrimElemRep

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrimElemRep -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrimElemRep -> r

gmapQ :: (forall d. Data d => d -> u) -> PrimElemRep -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrimElemRep -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrimElemRep -> m PrimElemRep

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimElemRep -> m PrimElemRep

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimElemRep -> m PrimElemRep

Enum PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Show PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

showsPrec :: Int -> PrimElemRep -> ShowS

show :: PrimElemRep -> String

showList :: [PrimElemRep] -> ShowS

Binary PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

put_ :: BinHandle -> PrimElemRep -> IO ()

put :: BinHandle -> PrimElemRep -> IO (Bin PrimElemRep)

get :: BinHandle -> IO PrimElemRep

Outputable PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: PrimElemRep -> SDoc #

Eq PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: PrimElemRep -> PrimElemRep -> Bool

(/=) :: PrimElemRep -> PrimElemRep -> Bool

Ord PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

data AlgTyConFlav #

Instances

Instances details
Outputable AlgTyConFlav 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: AlgTyConFlav -> SDoc #

data FamTyConFlav #

Instances

Instances details
Outputable FamTyConFlav 
Instance details

Defined in GHC.Core.TyCon

Methods

ppr :: FamTyConFlav -> SDoc #

data AlgTyConRhs #

Constructors

AbstractTyCon 
DataTyCon 

Fields

TupleTyCon 

Fields

SumTyCon 

Fields

NewTyCon 

Fields

data ExpandSynResult tyco #

Constructors

NoExpansion 
ExpandsSyn [(TyVar, tyco)] Type [tyco] 

data AnnExplicitSum #

Instances

Instances details
Data AnnExplicitSum 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnExplicitSum -> c AnnExplicitSum

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnExplicitSum

toConstr :: AnnExplicitSum -> Constr

dataTypeOf :: AnnExplicitSum -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnExplicitSum)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnExplicitSum)

gmapT :: (forall b. Data b => b -> b) -> AnnExplicitSum -> AnnExplicitSum

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnExplicitSum -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnExplicitSum -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnExplicitSum -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnExplicitSum -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnExplicitSum -> m AnnExplicitSum

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnExplicitSum -> m AnnExplicitSum

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnExplicitSum -> m AnnExplicitSum

data AnnFieldLabel #

Constructors

AnnFieldLabel 

Fields

Instances

Instances details
Data AnnFieldLabel 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnFieldLabel -> c AnnFieldLabel

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnFieldLabel

toConstr :: AnnFieldLabel -> Constr

dataTypeOf :: AnnFieldLabel -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnFieldLabel)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnFieldLabel)

gmapT :: (forall b. Data b => b -> b) -> AnnFieldLabel -> AnnFieldLabel

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnFieldLabel -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnFieldLabel -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnFieldLabel -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnFieldLabel -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnFieldLabel -> m AnnFieldLabel

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnFieldLabel -> m AnnFieldLabel

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnFieldLabel -> m AnnFieldLabel

data AnnProjection #

Constructors

AnnProjection 

Instances

Instances details
Data AnnProjection 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnProjection -> c AnnProjection

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnProjection

toConstr :: AnnProjection -> Constr

dataTypeOf :: AnnProjection -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnProjection)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnProjection)

gmapT :: (forall b. Data b => b -> b) -> AnnProjection -> AnnProjection

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnProjection -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnProjection -> r

gmapQ :: (forall d. Data d => d -> u) -> AnnProjection -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnProjection -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnProjection -> m AnnProjection

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnProjection -> m AnnProjection

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnProjection -> m AnnProjection

data DelayedSplice #

Instances

Instances details
Data DelayedSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DelayedSplice -> c DelayedSplice

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DelayedSplice

toConstr :: DelayedSplice -> Constr

dataTypeOf :: DelayedSplice -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DelayedSplice)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DelayedSplice)

gmapT :: (forall b. Data b => b -> b) -> DelayedSplice -> DelayedSplice

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DelayedSplice -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DelayedSplice -> r

gmapQ :: (forall d. Data d => d -> u) -> DelayedSplice -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> DelayedSplice -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DelayedSplice -> m DelayedSplice

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DelayedSplice -> m DelayedSplice

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DelayedSplice -> m DelayedSplice

data EpAnnUnboundVar #

Instances

Instances details
Data EpAnnUnboundVar 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnnUnboundVar -> c EpAnnUnboundVar

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpAnnUnboundVar

toConstr :: EpAnnUnboundVar -> Constr

dataTypeOf :: EpAnnUnboundVar -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpAnnUnboundVar)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpAnnUnboundVar)

gmapT :: (forall b. Data b => b -> b) -> EpAnnUnboundVar -> EpAnnUnboundVar

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnUnboundVar -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnUnboundVar -> r

gmapQ :: (forall d. Data d => d -> u) -> EpAnnUnboundVar -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnnUnboundVar -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnnUnboundVar -> m EpAnnUnboundVar

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnUnboundVar -> m EpAnnUnboundVar

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnUnboundVar -> m EpAnnUnboundVar

data HsExpansion orig expanded #

Constructors

HsExpanded orig expanded 

Instances

Instances details
(Data orig, Data expanded) => Data (HsExpansion orig expanded) 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsExpansion orig expanded -> c (HsExpansion orig expanded)

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsExpansion orig expanded)

toConstr :: HsExpansion orig expanded -> Constr

dataTypeOf :: HsExpansion orig expanded -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsExpansion orig expanded))

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsExpansion orig expanded))

gmapT :: (forall b. Data b => b -> b) -> HsExpansion orig expanded -> HsExpansion orig expanded

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsExpansion orig expanded -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsExpansion orig expanded -> r

gmapQ :: (forall d. Data d => d -> u) -> HsExpansion orig expanded -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsExpansion orig expanded -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded)

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded)

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded)

(Outputable a, Outputable b) => Outputable (HsExpansion a b) 
Instance details

Defined in GHC.Hs.Expr

Methods

ppr :: HsExpansion a b -> SDoc #

data MatchGroupTc #

Constructors

MatchGroupTc 

Instances

Instances details
Data MatchGroupTc 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MatchGroupTc -> c MatchGroupTc

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MatchGroupTc

toConstr :: MatchGroupTc -> Constr

dataTypeOf :: MatchGroupTc -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MatchGroupTc)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MatchGroupTc)

gmapT :: (forall b. Data b => b -> b) -> MatchGroupTc -> MatchGroupTc

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MatchGroupTc -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MatchGroupTc -> r

gmapQ :: (forall d. Data d => d -> u) -> MatchGroupTc -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> MatchGroupTc -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MatchGroupTc -> m MatchGroupTc

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchGroupTc -> m MatchGroupTc

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchGroupTc -> m MatchGroupTc

data UntypedSpliceFlavour #

Instances

Instances details
Data UntypedSpliceFlavour 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UntypedSpliceFlavour -> c UntypedSpliceFlavour

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UntypedSpliceFlavour

toConstr :: UntypedSpliceFlavour -> Constr

dataTypeOf :: UntypedSpliceFlavour -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UntypedSpliceFlavour)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UntypedSpliceFlavour)

gmapT :: (forall b. Data b => b -> b) -> UntypedSpliceFlavour -> UntypedSpliceFlavour

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UntypedSpliceFlavour -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UntypedSpliceFlavour -> r

gmapQ :: (forall d. Data d => d -> u) -> UntypedSpliceFlavour -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> UntypedSpliceFlavour -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UntypedSpliceFlavour -> m UntypedSpliceFlavour

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UntypedSpliceFlavour -> m UntypedSpliceFlavour

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UntypedSpliceFlavour -> m UntypedSpliceFlavour

type CmdSyntaxTable p = [(Name, HsExpr p)] #

type family SyntaxExprGhc (p :: Pass) = (r :: Type) | r -> p where ... #

data RawPkgQual #

Constructors

NoRawPkgQual 
RawPkgQual StringLiteral 

Instances

Instances details
Data RawPkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RawPkgQual -> c RawPkgQual

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RawPkgQual

toConstr :: RawPkgQual -> Constr

dataTypeOf :: RawPkgQual -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RawPkgQual)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RawPkgQual)

gmapT :: (forall b. Data b => b -> b) -> RawPkgQual -> RawPkgQual

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RawPkgQual -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RawPkgQual -> r

gmapQ :: (forall d. Data d => d -> u) -> RawPkgQual -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> RawPkgQual -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RawPkgQual -> m RawPkgQual

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RawPkgQual -> m RawPkgQual

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RawPkgQual -> m RawPkgQual

Outputable RawPkgQual 
Instance details

Defined in GHC.Types.PkgQual

Methods

ppr :: RawPkgQual -> SDoc #

data NakedScFlag #

Constructors

NakedSc 
NotNakedSc 

Instances

Instances details
Outputable NakedScFlag 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: NakedScFlag -> SDoc #

data RepPolyFun #

Constructors

RepPolyWiredIn !Id 
RepPolyDataCon !DataCon 

Instances

Instances details
Outputable RepPolyFun 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: RepPolyFun -> SDoc #

data StmtOrigin #

Instances

Instances details
Outputable StmtOrigin 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: StmtOrigin -> SDoc #

data TyVarBndrs #

Constructors

OutputableBndrFlag flag 'Renamed => HsTyVarBndrsRn [HsTyVarBndr flag GhcRn] 

Instances

Instances details
Outputable TyVarBndrs 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: TyVarBndrs -> SDoc #

data TypedThing #

Instances

Instances details
Outputable TypedThing 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

ppr :: TypedThing -> SDoc #

data ArgPos #

Constructors

ArgPosInvis 
ArgPosVis !Int 

data ClsInstOrQC #

Constructors

IsClsInst 
IsQC CtOrigin 

pattern ManyTy :: Mult #

pattern OneTy :: Mult #

(<$>) :: Functor f => (a -> b) -> f a -> f b #

loadExternalPlugins :: [ExternalPluginSpec] -> IO [ExternalPlugin] #

mapPlugins :: Plugins -> (Plugin -> [CommandLineOption] -> a) -> [a] #

withPlugins :: Monad m => Plugins -> PluginOperation m a -> a -> m a #

withPlugins_ :: Monad m => Plugins -> ConstPluginOperation m a -> a -> m () #

unLoc :: GenLocated l e -> e #

noHsTok :: forall (tok :: Symbol). GenLocated TokenLocation (HsToken tok) #

noHsUniTok :: forall (tok :: Symbol) (utok :: Symbol). GenLocated TokenLocation (HsUniToken tok utok) #

pprIfPs :: forall (p :: Pass). IsPass p => (p ~ 'Parsed => SDoc) -> SDoc #

pprIfRn :: forall (p :: Pass). IsPass p => (p ~ 'Renamed => SDoc) -> SDoc #

pprIfTc :: forall (p :: Pass). IsPass p => (p ~ 'Typechecked => SDoc) -> SDoc #

isCompleteMatchSig :: UnXRec p => LSig p -> Bool #

isFixityLSig :: UnXRec p => LSig p -> Bool #

isInlineLSig :: UnXRec p => LSig p -> Bool #

isMinimalLSig :: UnXRec p => LSig p -> Bool #

isPragLSig :: UnXRec p => LSig p -> Bool #

isSCCFunSig :: UnXRec p => LSig p -> Bool #

isSpecInstLSig :: UnXRec p => LSig p -> Bool #

isSpecLSig :: UnXRec p => LSig p -> Bool #

isTypeLSig :: UnXRec p => LSig p -> Bool #

docDeclDoc :: DocDecl pass -> LHsDoc pass #

isClassDecl :: TyClDecl pass -> Bool #

isDataDecl :: TyClDecl pass -> Bool #

isDataFamilyDecl :: TyClDecl pass -> Bool #

isFamilyDecl :: TyClDecl pass -> Bool #

isSynDecl :: TyClDecl pass -> Bool #

isTypeFamilyDecl :: TyClDecl pass -> Bool #

isInfixMatch :: Match id body -> Bool #

hsRecFieldsArgs :: UnXRec p => HsRecFields p arg -> [arg] #

hsMult :: HsScaled pass a -> HsArrow pass #

hsQTvExplicit :: LHsQTyVars pass -> [LHsTyVarBndr () pass] #

hsScaledThing :: HsScaled pass a -> a #

isHsKindedTyVar :: HsTyVarBndr flag pass -> Bool #

noTypeArgs :: [Void] #

isUnboundName :: Name -> Bool #

idName :: Id -> Name #

idType :: Id -> Kind #

lookupNameEnv :: NameEnv a -> Name -> Maybe a #

mkNameEnv :: [(Name, a)] -> NameEnv a #

elemOccSet :: OccName -> OccSet -> Bool #

brackets :: IsLine doc => doc -> doc #

comma :: IsLine doc => doc #

equals :: IsLine doc => doc #

hang :: SDoc -> Int -> SDoc -> SDoc #

parens :: IsLine doc => doc -> doc #

dePluginInit :: DefaultingPlugin -> TcPluginM s #

dePluginRun :: DefaultingPlugin -> s -> FillDefaulting #

dePluginStop :: DefaultingPlugin -> s -> TcPluginM () #

bootExports :: SelfBootInfo -> NameSet #

getPlatform :: TcRnIf a b Platform #

lintGblEnv :: Logger -> DynFlags -> TcGblEnv -> TcM () #

mkGivenEvBind :: EvVar -> EvTerm -> EvBind #

getEnvs :: TcRnIf gbl lcl (gbl, lcl) #

getTopEnv :: TcRnIf gbl lcl HscEnv #

traceTc :: String -> SDoc -> TcRn () #

fsLit :: String -> FastString #

getLoc :: GenLocated l e -> l #

mkRealSrcLoc :: FastString -> Int -> Int -> RealSrcLoc #

addCLocAA :: GenLocated (SrcSpanAnn' a1) e1 -> GenLocated (SrcSpanAnn' a2) e2 -> e3 -> GenLocated (SrcAnn ann) e3 #

addCommentsToEpAnn :: Monoid a => SrcSpan -> EpAnn a -> EpAnnComments -> EpAnn a #

addCommentsToSrcAnn :: Monoid ann => SrcAnn ann -> EpAnnComments -> SrcAnn ann #

combineLocsA :: Semigroup a => GenLocated (SrcAnn a) e1 -> GenLocated (SrcAnn a) e2 -> SrcAnn a #

combineSrcSpansA :: Semigroup a => SrcAnn a -> SrcAnn a -> SrcAnn a #

commentsOnlyA :: Monoid ann => SrcAnn ann -> SrcAnn ann #

deltaPos :: Int -> Int -> DeltaPos #

epAnnAnnsL :: EpAnn a -> [a] #

l2l :: SrcSpanAnn' a -> SrcAnn ann #

l2n :: LocatedAn a1 a2 -> LocatedN a2 #

la2la :: LocatedAn ann1 a2 -> LocatedAn ann2 a2 #

mapLocA :: (a -> b) -> GenLocated SrcSpan a -> GenLocated (SrcAnn ann) b #

noLocA :: a -> LocatedAn an a #

reAnnL :: ann -> EpAnnComments -> Located e -> GenLocated (SrcAnn ann) e #

reLoc :: LocatedAn a e -> Located e #

reLocA :: Located e -> LocatedAn ann e #

setCommentsEpAnn :: Monoid a => SrcSpan -> EpAnn a -> EpAnnComments -> EpAnn a #

setCommentsSrcAnn :: Monoid ann => SrcAnn ann -> EpAnnComments -> SrcAnn ann #

unpackFS :: FastString -> String #

braces :: IsLine doc => doc -> doc #

colon :: IsLine doc => doc #

int :: IsLine doc => Int -> doc #

ppUnless :: IsOutput doc => Bool -> doc -> doc #

ppWhen :: IsOutput doc => Bool -> doc -> doc #

whenPprDebug :: IsOutput doc => doc -> doc #

addCLoc :: Located a -> Located b -> c -> Located c #

advancePsLoc :: PsLoc -> Char -> PsLoc #

cmpBufSpan :: HasDebugCallStack => Located a -> Located a -> Ordering #

cmpLocated :: Ord a => GenLocated l a -> GenLocated l a -> Ordering #

eqLocated :: Eq a => GenLocated l a -> GenLocated l a -> Bool #

getBufPos :: SrcLoc -> Maybe BufPos #

isNoSrcSpan :: SrcSpan -> Bool #

leftmost_largest :: SrcSpan -> SrcSpan -> Ordering #

lookupSrcLoc :: SrcLoc -> Map RealSrcLoc a -> Maybe a #

lookupSrcSpan :: SrcSpan -> Map RealSrcSpan a -> Maybe a #

mkGeneralLocated :: String -> e -> Located e #

mkSrcLoc :: FastString -> Int -> Int -> SrcLoc #

noLoc :: e -> Located e #

pprUserSpan :: Bool -> SrcSpan -> SDoc #

spans :: SrcSpan -> (Int, Int) -> Bool #

alterOccEnv :: (Maybe elt -> Maybe elt) -> OccEnv elt -> OccName -> OccEnv elt #

elemOccEnv :: OccName -> OccEnv a -> Bool #

extendOccEnv :: OccEnv a -> OccName -> a -> OccEnv a #

extendOccEnvList :: OccEnv a -> [(OccName, a)] -> OccEnv a #

extendOccEnv_Acc :: (a -> b -> b) -> (a -> b) -> OccEnv b -> OccName -> a -> OccEnv b #

extendOccEnv_C :: (a -> a -> a) -> OccEnv a -> OccName -> a -> OccEnv a #

filterOccEnv :: (elt -> Bool) -> OccEnv elt -> OccEnv elt #

filterOccSet :: (OccName -> Bool) -> OccSet -> OccSet #

foldOccEnv :: (a -> b -> b) -> b -> OccEnv a -> b #

isDataOcc :: OccName -> Bool #

isSymOcc :: OccName -> Bool #

isTcOcc :: OccName -> Bool #

isTvOcc :: OccName -> Bool #

isValOcc :: OccName -> Bool #

isVarOcc :: OccName -> Bool #

lookupOccEnv :: OccEnv a -> OccName -> Maybe a #

mapOccEnv :: (a -> b) -> OccEnv a -> OccEnv b #

minusOccEnv_C :: (a -> b -> Maybe a) -> OccEnv a -> OccEnv b -> OccEnv a #

mkClsOcc :: String -> OccName #

mkDFunOcc :: String -> Bool -> OccSet -> OccName #

mkDataOcc :: String -> OccName #

mkInstTyTcOcc :: String -> OccSet -> OccName #

mkOccEnv :: [(OccName, a)] -> OccEnv a #

mkOccEnv_C :: (a -> a -> a) -> [(OccName, a)] -> OccEnv a #

mkOccName :: NameSpace -> String -> OccName #

mkTcOcc :: String -> OccName #

mkTyVarOcc :: String -> OccName #

mkVarOcc :: String -> OccName #

occNameString :: OccName -> String #

plusOccEnv_C :: (a -> a -> a) -> OccEnv a -> OccEnv a -> OccEnv a #

pprOccEnv :: (a -> SDoc) -> OccEnv a -> SDoc #

pprOccName :: IsLine doc => OccName -> doc #

unitOccEnv :: OccName -> a -> OccEnv a #

pprModule :: IsLine doc => Module -> doc #

pprUnit :: IsLine doc => Unit -> doc #

codeStyle :: PprStyle -> Bool #

dot :: IsLine doc => doc #

dumpStyle :: PprStyle -> Bool #

ppUnlessOption :: IsLine doc => (SDocContext -> Bool) -> doc -> doc #

pprInfixVar :: Bool -> SDoc -> SDoc #

pprModuleName :: IsLine doc => ModuleName -> doc #

pprPrefixVar :: Bool -> SDoc -> SDoc #

pprName :: IsLine doc => Name -> doc #

getOccString :: NamedThing a => a -> String #

isDataConName :: Name -> Bool #

isDynLinkName :: Platform -> Module -> Name -> Bool #

isExternalName :: Name -> Bool #

isHoleName :: Name -> Bool #

isInternalName :: Name -> Bool #

isSystemName :: Name -> Bool #

isTyConName :: Name -> Bool #

isTyVarName :: Name -> Bool #

isValName :: Name -> Bool #

isVarName :: Name -> Bool #

isWiredIn :: NamedThing thing => thing -> Bool #

isWiredInName :: Name -> Bool #

nameIsFromExternalPackage :: HomeUnit -> Name -> Bool #

nameModule :: HasDebugCallStack => Name -> Module #

nameStableString :: Name -> String #

stableNameCmp :: Name -> Name -> Ordering #

wiredInNameTyThing_maybe :: Name -> Maybe TyThing #

failIfM :: SDoc -> IfL a #

getLclEnv :: TcRnIf gbl lcl lcl #

newUniqueSupply :: TcRnIf gbl lcl UniqSupply #

traceIf :: SDoc -> TcRnIf m n () #

updLclEnv :: (lcl -> lcl) -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

lookupOrigNameCache :: OrigNameCache -> Module -> OccName -> Maybe Name #

isTyVar :: Var -> Bool #

allocateGlobalBinder :: NameCache -> Module -> OccName -> SrcSpan -> IO Name #

extendIfaceIdEnv :: [Id] -> IfL a -> IfL a #

ifaceExportNames :: [IfaceExport] -> TcRnIf gbl lcl [AvailInfo] #

lookupIfaceTyVar :: IfaceTvBndr -> IfL (Maybe TyVar) #

lookupIfaceVar :: IfaceBndr -> IfL (Maybe TyCoVar) #

lookupNameCache :: NameCache -> Module -> OccName -> IO Name #

newInteractiveBinder :: HscEnv -> OccName -> SrcSpan -> IO Name #

setNameModule :: Maybe Module -> Name -> TcRnIf m n Name #

trace_hi_diffs :: Logger -> SDoc -> IO () #

trace_if :: Logger -> SDoc -> IO () #

addHomeModuleToFinder :: FinderCache -> HomeUnit -> ModuleName -> ModLocation -> IO Module #

addModuleToFinder :: FinderCache -> Module -> ModLocation -> IO () #

findExactModule :: FinderCache -> FinderOpts -> UnitEnvGraph FinderOpts -> UnitState -> Maybe HomeUnit -> InstalledModule -> IO InstalledFindResult #

findObjectLinkable :: Module -> FilePath -> UTCTime -> IO Linkable #

findObjectLinkableMaybe :: Module -> ModLocation -> IO (Maybe Linkable) #

findPluginModule :: FinderCache -> FinderOpts -> UnitState -> Maybe HomeUnit -> ModuleName -> IO FindResult #

flushFinderCaches :: FinderCache -> UnitEnv -> IO () #

lookupFileCache :: FinderCache -> FilePath -> IO Fingerprint #

mkHiOnlyModLocation :: FinderOpts -> Suffix -> Suffix -> FilePath -> String -> ModLocation #

mkHiPath :: FinderOpts -> FilePath -> String -> FilePath #

mkHomeModLocation :: FinderOpts -> ModuleName -> FilePath -> ModLocation #

mkHomeModLocation2 :: FinderOpts -> ModuleName -> FilePath -> String -> ModLocation #

mkObjPath :: FinderOpts -> FilePath -> String -> FilePath #

mkStubPaths :: FinderOpts -> ModuleName -> ModLocation -> FilePath #

uncacheModule :: FinderCache -> HomeUnit -> ModuleName -> IO () #

bytesFS :: FastString -> ByteString #

angleBrackets :: IsLine doc => doc -> doc #

punctuate :: IsLine doc => doc -> [doc] -> [doc] #

sdocOption :: (SDocContext -> a) -> (a -> SDoc) -> SDoc #

isHoleUnit :: GenUnit u -> Bool #

mapGenUnit :: IsUnitId v => (u -> v) -> GenUnit u -> GenUnit v #

stableUnitCmp :: Unit -> Unit -> Ordering #

stringToUnit :: String -> Unit #

stringToUnitId :: String -> UnitId #

unitIdString :: UnitId -> String #

unitIsDefinite :: Unit -> Bool #

unitString :: IsUnitId u => u -> String #

isEmptyBag :: Bag a -> Bool #

unionBags :: Bag a -> Bag a -> Bag a #

unitBag :: a -> Bag a #

atomicUpdMutVar :: IORef a -> (a -> (a, b)) -> IOEnv env b #

atomicUpdMutVar' :: IORef a -> (a -> (a, b)) -> IOEnv env b #

failM :: IOEnv env a #

failWithM :: String -> IOEnv env a #

fixM :: (a -> IOEnv env a) -> IOEnv env a #

getEnv :: IOEnv env env #

newMutVar :: a -> IOEnv env (IORef a) #

readMutVar :: IORef a -> IOEnv env a #

runIOEnv :: env -> IOEnv env a -> IO a #

setEnv :: env' -> IOEnv env' a -> IOEnv env a #

tryAllM :: IOEnv env r -> IOEnv env (Either SomeException r) #

tryM :: IOEnv env r -> IOEnv env (Either IOEnvFailure r) #

tryMostM :: IOEnv env r -> IOEnv env (Either SomeException r) #

unsafeInterleaveM :: IOEnv env a -> IOEnv env a #

updEnv :: (env -> env') -> IOEnv env' a -> IOEnv env a #

updMutVar :: IORef a -> (a -> a) -> IOEnv env () #

updMutVarM :: IORef a -> (a -> IOEnv env a) -> IOEnv env () #

writeMutVar :: IORef a -> a -> IOEnv env () #

emptyLHsBinds :: forall (idL :: Pass) idR. LHsBindsLR (GhcPass idL) idR #

extendNameEnvList :: NameEnv a -> [(Name, a)] -> NameEnv a #

allM :: (Monad m, Foldable f) => (a -> m Bool) -> f a -> m Bool #

anyM :: (Monad m, Foldable f) => (a -> m Bool) -> f a -> m Bool #

concatMapM :: (Monad m, Traversable f) => (a -> m [b]) -> f a -> m [b] #

filterOutM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

foldlM_ :: (Monad m, Foldable t) => (a -> b -> m a) -> a -> t b -> m () #

mapAccumLM :: (Monad m, Traversable t) => (acc -> x -> m (acc, y)) -> acc -> t x -> m (acc, t y) #

mapAndUnzip3M :: Monad m => (a -> m (b, c, d)) -> [a] -> m ([b], [c], [d]) #

mapAndUnzip4M :: Monad m => (a -> m (b, c, d, e)) -> [a] -> m ([b], [c], [d], [e]) #

mapAndUnzip5M :: Monad m => (a -> m (b, c, d, e, f)) -> [a] -> m ([b], [c], [d], [e], [f]) #

mapMaybeM :: Applicative m => (a -> m (Maybe b)) -> [a] -> m [b] #

mapSndM :: (Applicative m, Traversable f) => (b -> m c) -> f (a, b) -> m (f (a, c)) #

orM :: Monad m => m Bool -> m Bool -> m Bool #

partitionM :: Monad m => (a -> m Bool) -> [a] -> m ([a], [a]) #

unlessM :: Monad m => m Bool -> m () -> m () #

whenM :: Monad m => m Bool -> m () -> m () #

zipWith3M :: Monad m => (a -> b -> c -> m d) -> [a] -> [b] -> [c] -> m [d] #

zipWith3M_ :: Monad m => (a -> b -> c -> m d) -> [a] -> [b] -> [c] -> m () #

zipWith4M :: Monad m => (a -> b -> c -> d -> m e) -> [a] -> [b] -> [c] -> [d] -> m [e] #

zipWithAndUnzipM :: Monad m => (a -> b -> m (c, d)) -> [a] -> [b] -> m ([c], [d]) #

nest :: Int -> SDoc -> SDoc #

mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #

foldlM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

foldrM :: (Foldable t, Monad m) => (a -> b -> m b) -> b -> t a -> m b #

addDependentFiles :: [FilePath] -> TcRn () #

addDetailedDiagnostic :: (ErrInfo -> TcRnMessage) -> TcM () #

addDiagnosticTcM :: (TidyEnv, TcRnMessage) -> TcM () #

addErrCtxt :: SDoc -> TcM a -> TcM a #

addErrCtxtM :: (TidyEnv -> TcM (TidyEnv, SDoc)) -> TcM a -> TcM a #

addErrTcM :: (TidyEnv, TcRnMessage) -> TcM () #

addLandmarkErrCtxtM :: (TidyEnv -> TcM (TidyEnv, SDoc)) -> TcM a -> TcM a #

addLocM :: (a -> TcM b) -> Located a -> TcM b #

addLocMA :: (a -> TcM b) -> GenLocated (SrcSpanAnn' ann) a -> TcM b #

addMessages :: Messages TcRnMessage -> TcRn () #

askNoErrs :: TcRn a -> TcRn (a, Bool) #

attemptM :: TcRn r -> TcRn (Maybe r) #

checkErr :: Bool -> TcRnMessage -> TcRn () #

checkNoErrs :: TcM r -> TcM r #

checkTc :: Bool -> TcRnMessage -> TcM () #

checkTcM :: Bool -> (TidyEnv, TcRnMessage) -> TcM () #

debugTc :: TcM () -> TcM () #

diagnosticTc :: Bool -> TcRnMessage -> TcM () #

diagnosticTcM :: Bool -> (TidyEnv, TcRnMessage) -> TcM () #

discardResult :: TcM a -> TcM () #

doptM :: DumpFlag -> TcRnIf gbl lcl Bool #

dumpOptTcRn :: DumpFlag -> String -> DumpFormat -> SDoc -> TcRn () #

dumpTcRn :: Bool -> DumpFlag -> String -> DumpFormat -> SDoc -> TcRn () #

emitHole :: Hole -> TcM () #

emitSimple :: Ct -> TcM () #

emitSimples :: Cts -> TcM () #

extendFixityEnv :: [(Name, FixItem)] -> RnM a -> RnM a #

failIfTc :: Bool -> TcRnMessage -> TcM () #

failIfTcM :: Bool -> (TidyEnv, TcRnMessage) -> TcM () #

failWithTcM :: (TidyEnv, TcRnMessage) -> TcM a #

finalSafeMode :: DynFlags -> TcGblEnv -> IO SafeHaskellMode #

fixSafeInstances :: SafeHaskellMode -> [ClsInst] -> [ClsInst] #

foldAndRecoverM :: (b -> a -> TcRn b) -> b -> [a] -> TcRn b #

forkM :: SDoc -> IfL a -> IfL a #

getCCIndexM :: (gbl -> TcRef CostCentreState) -> FastString -> TcRnIf gbl lcl CostCentreIndex #

getCCIndexTcM :: FastString -> TcM CostCentreIndex #

getEps :: TcRnIf gbl lcl ExternalPackageState #

getEpsAndHug :: TcRnIf gbl lcl (ExternalPackageState, HomeUnitGraph) #

getEpsVar :: TcRnIf gbl lcl (TcRef ExternalPackageState) #

getFixityEnv :: TcRn FixityEnv #

getGblEnv :: TcRnIf gbl lcl gbl #

getGhcMode :: TcRnIf gbl lcl GhcMode #

getGlobalRdrEnv :: TcRn GlobalRdrEnv #

getHpt :: TcRnIf gbl lcl HomePackageTable #

getIsGHCi :: TcRn Bool #

getLocalRdrEnv :: RnM LocalRdrEnv #

getRdrEnvs :: TcRn (GlobalRdrEnv, LocalRdrEnv) #

getTcEvTyCoVars :: EvBindsVar -> TcM TyCoVarSet #

goptM :: GeneralFlag -> TcRnIf gbl lcl Bool #

ifErrsM :: TcRn r -> TcRn r -> TcRn r #

initIfaceCheck :: SDoc -> HscEnv -> IfG a -> IO a #

initIfaceLoad :: HscEnv -> IfG a -> IO a #

initIfaceLoadModule :: HscEnv -> Module -> IfG a -> IO a #

initTc :: HscEnv -> HscSource -> Bool -> Module -> RealSrcSpan -> TcM r -> IO (Messages TcRnMessage, Maybe r) #

initTcInteractive :: HscEnv -> TcM a -> IO (Messages TcRnMessage, Maybe a) #

initTcRnIf :: Char -> HscEnv -> gbl -> lcl -> TcRnIf gbl lcl a -> IO a #

initTcWithGbl :: HscEnv -> TcGblEnv -> RealSrcSpan -> TcM r -> IO (Messages TcRnMessage, Maybe r) #

keepAlive :: Name -> TcRn () #

mapAndRecoverM :: (a -> TcRn b) -> [a] -> TcRn [b] #

mapAndReportM :: (a -> TcRn b) -> [a] -> TcRn [b] #

mkDetailedMessage :: ErrInfo -> TcRnMessage -> TcRnMessageDetailed #

mkErrInfo :: TidyEnv -> [ErrCtxt] -> TcM SDoc #

newTcRef :: a -> TcRnIf gbl lcl (TcRef a) #

popErrCtxt :: TcM a -> TcM a #

readTcRef :: TcRef a -> TcRnIf gbl lcl a #

recordThNeededRuntimeDeps :: [Linkable] -> PkgsLoaded -> TcM () #

recoverM :: TcRn r -> TcRn r -> TcRn r #

reportDiagnostic :: MsgEnvelope TcRnMessage -> TcRn () #

reportDiagnostics :: [MsgEnvelope TcRnMessage] -> TcM () #

setCtLocM :: CtLoc -> TcM a -> TcM a #

setEnvs :: (gbl', lcl') -> TcRnIf gbl' lcl' a -> TcRnIf gbl lcl a #

setErrCtxt :: [ErrCtxt] -> TcM a -> TcM a #

setErrsVar :: TcRef (Messages TcRnMessage) -> TcRn a -> TcRn a #

setGblEnv :: gbl' -> TcRnIf gbl' lcl a -> TcRnIf gbl lcl a #

setImplicitEnvM :: TypeEnv -> IfL a -> IfL a #

setLclEnv :: lcl' -> TcRnIf gbl lcl' a -> TcRnIf gbl lcl a #

setLocalRdrEnv :: LocalRdrEnv -> RnM a -> RnM a #

setSrcSpanA :: SrcSpanAnn' ann -> TcRn a -> TcRn a #

setStage :: ThStage -> TcM a -> TcRn a #

setTcLevel :: TcLevel -> TcM a -> TcM a #

setXOptM :: Extension -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

tcCollectingUsage :: TcM a -> TcM (UsageEnv, a) #

tcEmitBindingUsage :: UsageEnv -> TcM () #

tcIsHsig :: TcRn Bool #

tcScalingUsage :: Mult -> TcM a -> TcM a #

traceOptIf :: DumpFlag -> SDoc -> TcRnIf m n () #

traceOptTcRn :: DumpFlag -> SDoc -> TcRn () #

traceRn :: String -> SDoc -> TcRn () #

traceTcConstraints :: String -> TcM () #

tryTc :: TcRn a -> TcRn (Maybe a, Messages TcRnMessage) #

unlessXOptM :: Extension -> TcRnIf gbl lcl () -> TcRnIf gbl lcl () #

unsetGOptM :: GeneralFlag -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

unsetWOptM :: WarningFlag -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

unsetXOptM :: Extension -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

updEnvs :: ((gbl, lcl) -> (gbl, lcl)) -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

updGblEnv :: (gbl -> gbl) -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

updTcRef :: TcRef a -> (a -> a) -> TcRnIf gbl lcl () #

updTopEnv :: (HscEnv -> HscEnv) -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

updTopFlags :: (DynFlags -> DynFlags) -> TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

updateEps :: (ExternalPackageState -> (ExternalPackageState, a)) -> TcRnIf gbl lcl a #

updateEps_ :: (ExternalPackageState -> ExternalPackageState) -> TcRnIf gbl lcl () #

warnIf :: Bool -> TcRnMessage -> TcRn () #

whenDOptM :: DumpFlag -> TcRnIf gbl lcl () -> TcRnIf gbl lcl () #

whenGOptM :: GeneralFlag -> TcRnIf gbl lcl () -> TcRnIf gbl lcl () #

whenNoErrs :: TcM () -> TcM () #

whenWOptM :: WarningFlag -> TcRnIf gbl lcl () -> TcRnIf gbl lcl () #

whenXOptM :: Extension -> TcRnIf gbl lcl () -> TcRnIf gbl lcl () #

withException :: MonadIO m => SDocContext -> m (MaybeErr SDoc a) -> m a #

withoutDynamicNow :: TcRnIf gbl lcl a -> TcRnIf gbl lcl a #

woptM :: WarningFlag -> TcRnIf gbl lcl Bool #

wrapLocAM :: (a -> TcM b) -> LocatedAn an a -> TcM (Located b) #

wrapLocFstM :: (a -> TcM (b, c)) -> Located a -> TcM (Located b, c) #

wrapLocFstMA :: (a -> TcM (b, c)) -> GenLocated (SrcSpanAnn' ann) a -> TcM (GenLocated (SrcSpanAnn' ann) b, c) #

wrapLocM :: (a -> TcM b) -> Located a -> TcM (Located b) #

wrapLocMA :: (a -> TcM b) -> GenLocated (SrcSpanAnn' ann) a -> TcRn (GenLocated (SrcSpanAnn' ann) b) #

wrapLocMA_ :: (a -> TcM ()) -> LocatedA a -> TcM () #

wrapLocM_ :: (a -> TcM ()) -> Located a -> TcM () #

wrapLocSndM :: (a -> TcM (b, c)) -> Located a -> TcM (b, Located c) #

wrapLocSndMA :: (a -> TcM (b, c)) -> GenLocated (SrcSpanAnn' ann) a -> TcM (b, GenLocated (SrcSpanAnn' ann) c) #

writeTcRef :: TcRef a -> a -> TcRnIf gbl lcl () #

xoptM :: Extension -> TcRnIf gbl lcl Bool #

filterBag :: (a -> Bool) -> Bag a -> Bag a #

mapBag :: (a -> b) -> Bag a -> Bag b #

hPutFS :: Handle -> FastString -> IO () #

hPutFZS :: Handle -> FastZString -> IO () #

lengthPS :: PtrString -> Int #

mkFastStringBytes :: Ptr Word8 -> Int -> FastString #

nullFS :: FastString -> Bool #

unconsFS :: FastString -> Maybe (Char, FastString) #

unpackPtrStringTakeN :: Int -> PtrString -> String #

unsafeMkByteString :: String -> ByteString #

zString :: FastZString -> String #

zStringTakeN :: Int -> FastZString -> String #

mkChunkified :: ([a] -> a) -> [a] -> a #

isUnliftedType :: HasDebugCallStack => Type -> Bool #

anyBag :: (a -> Bool) -> Bag a -> Bool #

bagToList :: Bag a -> [a] #

foldBag :: (r -> r -> r) -> (a -> r) -> r -> Bag a -> r #

unionManyBags :: [Bag a] -> Bag a #

emptyLocalBinds :: forall (a :: Pass) (b :: Pass). HsLocalBindsLR (GhcPass a) (GhcPass b) #

gHsPar :: forall (id :: Pass). LHsExpr (GhcPass id) -> HsExpr (GhcPass id) #

noExpr :: forall (p :: Pass). HsExpr (GhcPass p) #

noSyntaxExpr :: forall (p :: Pass). IsPass p => SyntaxExpr (GhcPass p) #

parenthesizeHsExpr :: forall (p :: Pass). IsPass p => PprPrec -> LHsExpr (GhcPass p) -> LHsExpr (GhcPass p) #

mkHsAppKindTy :: forall (p :: Pass). XAppKindTy (GhcPass p) -> LHsType (GhcPass p) -> LHsType (GhcPass p) -> LHsType (GhcPass p) #

mkHsAppTy :: forall (p :: Pass). LHsType (GhcPass p) -> LHsType (GhcPass p) -> LHsType (GhcPass p) #

isId :: Var -> Bool #

hsForeignDeclsBinders :: forall (p :: Pass) a. (UnXRec (GhcPass p), IsSrcSpanAnn p a) => [LForeignDecl (GhcPass p)] -> [LIdP (GhcPass p)] #

mkLocatedList :: Semigroup a => [GenLocated (SrcAnn a) e2] -> LocatedAn an [GenLocated (SrcAnn a) e2] #

mkParPat :: forall (p :: Pass). IsPass p => LPat (GhcPass p) -> LPat (GhcPass p) #

collectHsIdBinders :: forall (idL :: Pass) (idR :: Pass). CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> HsValBindsLR (GhcPass idL) (GhcPass idR) -> [IdP (GhcPass idL)] #

collectHsValBinders :: forall (idL :: Pass) idR. CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> HsValBindsLR (GhcPass idL) idR -> [IdP (GhcPass idL)] #

collectLStmtBinders :: forall (idL :: Pass) (idR :: Pass) body. CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> LStmtLR (GhcPass idL) (GhcPass idR) body -> [IdP (GhcPass idL)] #

collectLStmtsBinders :: forall (idL :: Pass) (idR :: Pass) body. CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> [LStmtLR (GhcPass idL) (GhcPass idR) body] -> [IdP (GhcPass idL)] #

collectLocalBinders :: forall (idL :: Pass) (idR :: Pass). CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> HsLocalBindsLR (GhcPass idL) (GhcPass idR) -> [IdP (GhcPass idL)] #

collectMethodBinders :: UnXRec idL => LHsBindsLR idL idR -> [LIdP idL] #

collectStmtBinders :: forall (idL :: Pass) (idR :: Pass) body. CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> StmtLR (GhcPass idL) (GhcPass idR) body -> [IdP (GhcPass idL)] #

collectStmtsBinders :: forall (idL :: Pass) (idR :: Pass) body. CollectPass (GhcPass idL) => CollectFlag (GhcPass idL) -> [StmtLR (GhcPass idL) (GhcPass idR) body] -> [IdP (GhcPass idL)] #

emptyRecStmt :: forall (idL :: Pass) bodyR. Anno [GenLocated (Anno (StmtLR (GhcPass idL) GhcPs bodyR)) (StmtLR (GhcPass idL) GhcPs bodyR)] ~ SrcSpanAnnL => StmtLR (GhcPass idL) GhcPs bodyR #

getPatSynBinds :: UnXRec id => [(RecFlag, LHsBinds id)] -> [PatSynBind id id] #

hsLTyClDeclBinders :: forall (p :: Pass). IsPass p => LocatedA (TyClDecl (GhcPass p)) -> ([LocatedA (IdP (GhcPass p))], [LFieldOcc (GhcPass p)]) #

hsPatSynSelectors :: forall (p :: Pass). IsPass p => HsValBinds (GhcPass p) -> [FieldOcc (GhcPass p)] #

hsValBindsImplicits :: forall (idR :: Pass). HsValBindsLR GhcRn (GhcPass idR) -> [(SrcSpan, [Name])] #

isInfixFunBind :: forall id1 id2. UnXRec id2 => HsBindLR id1 id2 -> Bool #

lStmtsImplicits :: forall (idR :: Pass) (body :: Type -> Type). [LStmtLR GhcRn (GhcPass idR) (LocatedA (body (GhcPass idR)))] -> [(SrcSpan, [Name])] #

mkBigLHsTup :: forall (id :: Pass). [LHsExpr (GhcPass id)] -> XExplicitTuple (GhcPass id) -> LHsExpr (GhcPass id) #

mkBigLHsVarTup :: forall (p :: Pass) a. IsSrcSpanAnn p a => [IdP (GhcPass p)] -> XExplicitTuple (GhcPass p) -> LHsExpr (GhcPass p) #

mkBodyStmt :: forall bodyR (idL :: Pass). LocatedA (bodyR GhcPs) -> StmtLR (GhcPass idL) GhcPs (LocatedA (bodyR GhcPs)) #

mkConLikeTc :: ConLike -> HsExpr GhcTc #

mkHsApp :: forall (id :: Pass). LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

mkHsAppWith :: forall (id :: Pass). (LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) -> HsExpr (GhcPass id) -> LHsExpr (GhcPass id)) -> LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

mkHsApps :: forall (id :: Pass). LHsExpr (GhcPass id) -> [LHsExpr (GhcPass id)] -> LHsExpr (GhcPass id) #

mkHsAppsWith :: forall (id :: Pass). (LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) -> HsExpr (GhcPass id) -> LHsExpr (GhcPass id)) -> LHsExpr (GhcPass id) -> [LHsExpr (GhcPass id)] -> LHsExpr (GhcPass id) #

mkHsCaseAlt :: forall (p :: Pass) body. (Anno (GRHS (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcAnn NoEpAnns, Anno (Match (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcSpanAnnA) => LPat (GhcPass p) -> LocatedA (body (GhcPass p)) -> LMatch (GhcPass p) (LocatedA (body (GhcPass p))) #

mkHsCharPrimLit :: forall (p :: Pass). Char -> HsLit (GhcPass p) #

mkHsFractional :: FractionalLit -> HsOverLit GhcPs #

mkHsIntegral :: IntegralLit -> HsOverLit GhcPs #

mkHsLam :: forall (p :: Pass). (IsPass p, XMG (GhcPass p) (LHsExpr (GhcPass p)) ~ Origin) => [LPat (GhcPass p)] -> LHsExpr (GhcPass p) -> LHsExpr (GhcPass p) #

mkHsLams :: [TyVar] -> [EvVar] -> LHsExpr GhcTc -> LHsExpr GhcTc #

mkHsPar :: forall (id :: Pass). LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

mkHsSigEnv :: (LSig GhcRn -> Maybe ([LocatedN Name], a)) -> [LSig GhcRn] -> NameEnv a #

mkHsString :: forall (p :: Pass). String -> HsLit (GhcPass p) #

mkHsStringFS :: forall (p :: Pass). FastString -> HsLit (GhcPass p) #

mkHsStringPrimLit :: forall (p :: Pass). FastString -> HsLit (GhcPass p) #

mkLHsPar :: forall (id :: Pass). IsPass id => LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

mkLHsTupleExpr :: forall (p :: Pass). [LHsExpr (GhcPass p)] -> XExplicitTuple (GhcPass p) -> LHsExpr (GhcPass p) #

mkLHsVarTuple :: forall (p :: Pass) a. IsSrcSpanAnn p a => [IdP (GhcPass p)] -> XExplicitTuple (GhcPass p) -> LHsExpr (GhcPass p) #

mkLamCaseMatchGroup :: forall (p :: Pass) body. AnnoBody p body => Origin -> LamCaseVariant -> LocatedL [LocatedA (Match (GhcPass p) (LocatedA (body (GhcPass p))))] -> MatchGroup (GhcPass p) (LocatedA (body (GhcPass p))) #

mkLastStmt :: forall (idR :: Pass) bodyR (idL :: Pass). IsPass idR => LocatedA (bodyR (GhcPass idR)) -> StmtLR (GhcPass idL) (GhcPass idR) (LocatedA (bodyR (GhcPass idR))) #

mkMatch :: forall (p :: Pass). IsPass p => HsMatchContext (GhcPass p) -> [LPat (GhcPass p)] -> LHsExpr (GhcPass p) -> HsLocalBinds (GhcPass p) -> LMatch (GhcPass p) (LHsExpr (GhcPass p)) #

mkMatchGroup :: forall (p :: Pass) body. AnnoBody p body => Origin -> LocatedL [LocatedA (Match (GhcPass p) (LocatedA (body (GhcPass p))))] -> MatchGroup (GhcPass p) (LocatedA (body (GhcPass p))) #

mkRecStmt :: forall (idL :: Pass) bodyR. Anno [GenLocated (Anno (StmtLR (GhcPass idL) GhcPs bodyR)) (StmtLR (GhcPass idL) GhcPs bodyR)] ~ SrcSpanAnnL => EpAnn AnnList -> LocatedL [LStmtLR (GhcPass idL) GhcPs bodyR] -> StmtLR (GhcPass idL) GhcPs bodyR #

mkSimpleMatch :: forall (p :: Pass) body. (Anno (Match (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcSpanAnnA, Anno (GRHS (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcAnn NoEpAnns) => HsMatchContext (GhcPass p) -> [LPat (GhcPass p)] -> LocatedA (body (GhcPass p)) -> LMatch (GhcPass p) (LocatedA (body (GhcPass p))) #

mkVarBind :: forall (p :: Pass). IdP (GhcPass p) -> LHsExpr (GhcPass p) -> LHsBind (GhcPass p) #

nlConPat :: RdrName -> [LPat GhcPs] -> LPat GhcPs #

nlConVarPat :: RdrName -> [RdrName] -> LPat GhcPs #

nlHsApp :: forall (id :: Pass). IsPass id => LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

nlHsAppKindTy :: forall (p :: Pass). LHsType (GhcPass p) -> LHsKind (GhcPass p) -> LHsType (GhcPass p) #

nlHsAppTy :: forall (p :: Pass). LHsType (GhcPass p) -> LHsType (GhcPass p) -> LHsType (GhcPass p) #

nlHsApps :: forall (p :: Pass) a. IsSrcSpanAnn p a => IdP (GhcPass p) -> [LHsExpr (GhcPass p)] -> LHsExpr (GhcPass p) #

nlHsDataCon :: DataCon -> LHsExpr GhcTc #

nlHsFunTy :: forall (p :: Pass). LHsType (GhcPass p) -> LHsType (GhcPass p) -> LHsType (GhcPass p) #

nlHsIntLit :: forall (p :: Pass). Integer -> LHsExpr (GhcPass p) #

nlHsLit :: forall (p :: Pass). HsLit (GhcPass p) -> LHsExpr (GhcPass p) #

nlHsPar :: forall (id :: Pass). LHsExpr (GhcPass id) -> LHsExpr (GhcPass id) #

nlHsParTy :: forall (p :: Pass). LHsType (GhcPass p) -> LHsType (GhcPass p) #

nlHsTyConApp :: forall (p :: Pass) a. IsSrcSpanAnn p a => PromotionFlag -> LexicalFixity -> IdP (GhcPass p) -> [LHsTypeArg (GhcPass p)] -> LHsType (GhcPass p) #

nlHsTyVar :: forall (p :: Pass) a. IsSrcSpanAnn p a => PromotionFlag -> IdP (GhcPass p) -> LHsType (GhcPass p) #

nlHsVar :: forall (p :: Pass) a. IsSrcSpanAnn p a => IdP (GhcPass p) -> LHsExpr (GhcPass p) #

nlHsVarApps :: forall (p :: Pass) a. IsSrcSpanAnn p a => IdP (GhcPass p) -> [IdP (GhcPass p)] -> LHsExpr (GhcPass p) #

nlNullaryConPat :: RdrName -> LPat GhcPs #

nlParPat :: forall (name :: Pass). LPat (GhcPass name) -> LPat (GhcPass name) #

nlVarPat :: forall (p :: Pass) a. IsSrcSpanAnn p a => IdP (GhcPass p) -> LPat (GhcPass p) #

nlWildConPat :: DataCon -> LPat GhcPs #

nl_HsVar :: forall (p :: Pass) a. IsSrcSpanAnn p a => IdP (GhcPass p) -> HsExpr (GhcPass p) #

unguardedGRHSs :: forall (p :: Pass) body. Anno (GRHS (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcAnn NoEpAnns => SrcSpan -> LocatedA (body (GhcPass p)) -> EpAnn GrhsAnn -> GRHSs (GhcPass p) (LocatedA (body (GhcPass p))) #

unguardedRHS :: forall (p :: Pass) body. Anno (GRHS (GhcPass p) (LocatedA (body (GhcPass p)))) ~ SrcAnn NoEpAnns => EpAnn GrhsAnn -> SrcSpan -> LocatedA (body (GhcPass p)) -> [LGRHS (GhcPass p) (LocatedA (body (GhcPass p)))] #

hsExprNeedsParens :: forall (p :: Pass). IsPass p => PprPrec -> HsExpr (GhcPass p) -> Bool #

pprWithCommas :: (a -> SDoc) -> [a] -> SDoc #

disjointUniqSets :: UniqSet a -> UniqSet a -> Bool #

elementOfUniqSet :: Uniquable a => a -> UniqSet a -> Bool #

filterUniqSet :: (a -> Bool) -> UniqSet a -> UniqSet a #

filterUniqSet_Directly :: (Unique -> elt -> Bool) -> UniqSet elt -> UniqSet elt #

getUniqSet :: UniqSet a -> UniqFM a a #

isEmptyUniqSet :: UniqSet a -> Bool #

lookupUniqSet :: Uniquable key => UniqSet key -> key -> Maybe key #

mapUniqSet :: Uniquable b => (a -> b) -> UniqSet a -> UniqSet b #

mkUniqSet :: Uniquable a => [a] -> UniqSet a #

nonDetEltsUniqSet :: UniqSet elt -> [elt] #

nonDetStrictFoldUniqSet :: (elt -> a -> a) -> a -> UniqSet elt -> a #

partitionUniqSet :: (a -> Bool) -> UniqSet a -> (UniqSet a, UniqSet a) #

pprUniqSet :: (a -> SDoc) -> UniqSet a -> SDoc #

restrictUniqSetToUFM :: UniqSet key -> UniqFM key b -> UniqSet key #

sizeUniqSet :: UniqSet a -> Int #

uniqSetAll :: (a -> Bool) -> UniqSet a -> Bool #

uniqSetAny :: (a -> Bool) -> UniqSet a -> Bool #

uniqSetMinusUDFM :: UniqSet key -> UniqDFM key b -> UniqSet key #

uniqSetMinusUFM :: UniqSet key -> UniqFM key b -> UniqSet key #

unsafeUFMToUniqSet :: UniqFM a a -> UniqSet a #

($+$) :: SDoc -> SDoc -> SDoc #

cat :: [SDoc] -> SDoc #

fcat :: [SDoc] -> SDoc #

hangNotEmpty :: SDoc -> Int -> SDoc -> SDoc #

integer :: IsLine doc => Integer -> doc #

isEmpty :: SDocContext -> SDoc -> Bool #

space :: IsLine doc => doc #

bPutHDoc :: BufHandle -> SDocContext -> HDoc -> IO () #

bufLeftRenderSDoc :: SDocContext -> BufHandle -> SDoc -> IO () #

coloured :: PprColour -> SDoc -> SDoc #

cparen :: Bool -> SDoc -> SDoc #

doOrDoes :: [a] -> SDoc #

docToSDoc :: Doc -> SDoc #

double :: IsLine doc => Double -> doc #

doublePrec :: Int -> Double -> SDoc #

doubleQuotes :: IsLine doc => doc -> doc #

float :: IsLine doc => Float -> doc #

getPprDebug :: IsOutput doc => (Bool -> doc) -> doc #

hasOrHave :: [a] -> SDoc #

ifPprDebug :: IsOutput doc => doc -> doc -> doc #

intWithCommas :: Integral a => a -> SDoc #

interpp'SP :: Outputable a => [a] -> SDoc #

interpp'SP' :: (a -> SDoc) -> [a] -> SDoc #

interppSP :: Outputable a => [a] -> SDoc #

isOrAre :: [a] -> SDoc #

itsOrTheir :: [a] -> SDoc #

lbrace :: IsLine doc => doc #

lbrack :: IsLine doc => doc #

lparen :: IsLine doc => doc #

plural :: [a] -> SDoc #

ppWhenOption :: (SDocContext -> Bool) -> SDoc -> SDoc #

pprDebugAndThen :: SDocContext -> (String -> a) -> SDoc -> SDoc -> a #

pprDeeperList :: ([SDoc] -> SDoc) -> [SDoc] -> SDoc #

pprFilePathString :: IsLine doc => FilePath -> doc #

pprHsBytes :: ByteString -> SDoc #

pprHsChar :: Char -> SDoc #

pprPrimChar :: Char -> SDoc #

pprPrimInt :: Integer -> SDoc #

pprPrimInt16 :: Integer -> SDoc #

pprPrimInt32 :: Integer -> SDoc #

pprPrimInt64 :: Integer -> SDoc #

pprPrimInt8 :: Integer -> SDoc #

pprPrimWord :: Integer -> SDoc #

pprPrimWord16 :: Integer -> SDoc #

pprPrimWord32 :: Integer -> SDoc #

pprPrimWord64 :: Integer -> SDoc #

pprPrimWord8 :: Integer -> SDoc #

pprWithBars :: (a -> SDoc) -> [a] -> SDoc #

printSDoc :: SDocContext -> Mode -> Handle -> SDoc -> IO () #

printSDocLn :: SDocContext -> Mode -> Handle -> SDoc -> IO () #

rational :: Rational -> SDoc #

rbrace :: IsLine doc => doc #

rbrack :: IsLine doc => doc #

rparen :: IsLine doc => doc #

runSDoc :: SDoc -> SDocContext -> Doc #

semi :: IsLine doc => doc #

showPprUnsafe :: Outputable a => a -> String #

showSDocUnsafe :: SDoc -> String #

singular :: [a] -> SDoc #

speakN :: Int -> SDoc #

speakNOf :: Int -> SDoc -> SDoc #

speakNth :: Int -> SDoc #

thisOrThese :: [a] -> SDoc #

underscore :: IsLine doc => doc #

userStyle :: PprStyle -> Bool #

vbar :: IsLine doc => doc #

word :: Integer -> SDoc #

pprExpr :: forall (p :: Pass). OutputableBndrId p => HsExpr (GhcPass p) -> SDoc #

pprFunBind :: forall (idR :: Pass). OutputableBndrId idR => MatchGroup (GhcPass idR) (LHsExpr (GhcPass idR)) -> SDoc #

pprPatBind :: forall (bndr :: Pass) (p :: Pass). (OutputableBndrId bndr, OutputableBndrId p) => LPat (GhcPass bndr) -> GRHSs (GhcPass p) (LHsExpr (GhcPass p)) -> SDoc #

pprVarSig :: OutputableBndr id => [id] -> SDoc -> SDoc #

ppr_sig :: forall (p :: Pass). OutputableBndrId p => Sig (GhcPass p) -> SDoc #

emptyValBindsIn :: forall (a :: Pass) (b :: Pass). HsValBindsLR (GhcPass a) (GhcPass b) #

emptyValBindsOut :: forall (a :: Pass) (b :: Pass). HsValBindsLR (GhcPass a) (GhcPass b) #

extractSpecPragName :: SourceText -> String #

hsSigDoc :: forall (p :: Pass). IsPass p => Sig (GhcPass p) -> SDoc #

isEmptyIPBindsPR :: forall (p :: Pass). HsIPBinds (GhcPass p) -> Bool #

isEmptyLHsBinds :: forall (idL :: Pass) idR. LHsBindsLR (GhcPass idL) idR -> Bool #

isEmptyValBinds :: forall (a :: Pass) (b :: Pass). HsValBindsLR (GhcPass a) (GhcPass b) -> Bool #

pprLHsBinds :: forall (idL :: Pass) (idR :: Pass). (OutputableBndrId idL, OutputableBndrId idR) => LHsBindsLR (GhcPass idL) (GhcPass idR) -> SDoc #

pprLHsBindsForUser :: forall (idL :: Pass) (idR :: Pass) (id2 :: Pass). (OutputableBndrId idL, OutputableBndrId idR, OutputableBndrId id2) => LHsBindsLR (GhcPass idL) (GhcPass idR) -> [LSig (GhcPass id2)] -> [SDoc] #

pprMinimalSig :: OutputableBndr name => LBooleanFormula (GenLocated l name) -> SDoc #

ppr_monobind :: forall (idL :: Pass) (idR :: Pass). (OutputableBndrId idL, OutputableBndrId idR) => HsBindLR (GhcPass idL) (GhcPass idR) -> SDoc #

pragSrcBrackets :: SourceText -> String -> SDoc -> SDoc #

consBag :: a -> Bag a -> Bag a #

snocBag :: Bag a -> a -> Bag a #

allBag :: (a -> Bool) -> Bag a -> Bool #

anyBagM :: Monad m => (a -> m Bool) -> Bag a -> m Bool #

catBagMaybes :: Bag (Maybe a) -> Bag a #

concatBag :: Bag (Bag a) -> Bag a #

concatMapBag :: (a -> Bag b) -> Bag a -> Bag b #

concatMapBagPair :: (a -> (Bag b, Bag c)) -> Bag a -> (Bag b, Bag c) #

elemBag :: Eq a => a -> Bag a -> Bool #

filterBagM :: Monad m => (a -> m Bool) -> Bag a -> m (Bag a) #

flatMapBagM :: Monad m => (a -> m (Bag b)) -> Bag a -> m (Bag b) #

flatMapBagPairM :: Monad m => (a -> m (Bag b, Bag c)) -> Bag a -> m (Bag b, Bag c) #

headMaybe :: Bag a -> Maybe a #

isSingletonBag :: Bag a -> Bool #

lengthBag :: Bag a -> Int #

listToBag :: [a] -> Bag a #

mapAccumBagL :: (acc -> x -> (acc, y)) -> acc -> Bag x -> (acc, Bag y) #

mapAccumBagLM :: Monad m => (acc -> x -> m (acc, y)) -> acc -> Bag x -> m (acc, Bag y) #

mapAndUnzipBagM :: Monad m => (a -> m (b, c)) -> Bag a -> m (Bag b, Bag c) #

mapBagM :: Monad m => (a -> m b) -> Bag a -> m (Bag b) #

mapBagM_ :: Monad m => (a -> m b) -> Bag a -> m () #

mapMaybeBag :: (a -> Maybe b) -> Bag a -> Bag b #

nonEmptyToBag :: NonEmpty a -> Bag a #

partitionBag :: (a -> Bool) -> Bag a -> (Bag a, Bag a) #

partitionBagWith :: (a -> Either b c) -> Bag a -> (Bag b, Bag c) #

unzipBag :: Bag (a, b) -> (Bag a, Bag b) #

isBoxed :: Boxity -> Bool #

failed :: SuccessFlag -> Bool #

inlineSpecSource :: InlineSpec -> SourceText #

intGtLimit :: Int -> IntWithInf -> Bool #

isDeadOcc :: OccInfo -> Bool #

isGenerated :: Origin -> Bool #

isManyOccs :: OccInfo -> Bool #

isMarkedCbv :: CbvMark -> Bool #

isNoOccInfo :: OccInfo -> Bool #

isNonRec :: RecFlag -> Bool #

isOneOcc :: OccInfo -> Bool #

isRec :: RecFlag -> Bool #

isSwapped :: SwapFlag -> Bool #

mightBeLifted :: Maybe Levity -> Bool #

mightBeUnlifted :: Maybe Levity -> Bool #

pickLR :: LeftOrRight -> (a, a) -> a #

pprAlternative :: (a -> SDoc) -> a -> ConTag -> Arity -> SDoc #

unSwap :: SwapFlag -> (a -> a -> b) -> a -> a -> b #

adjustDNameEnv :: (a -> a) -> DNameEnv a -> Name -> DNameEnv a #

alterDNameEnv :: (Maybe a -> Maybe a) -> DNameEnv a -> Name -> DNameEnv a #

alterNameEnv :: (Maybe a -> Maybe a) -> NameEnv a -> Name -> NameEnv a #

anyNameEnv :: (elt -> Bool) -> NameEnv elt -> Bool #

depAnal :: (node -> [Name]) -> (node -> [Name]) -> [node] -> [SCC node] #

disjointNameEnv :: NameEnv a -> NameEnv a -> Bool #

elemNameEnv :: Name -> NameEnv a -> Bool #

eltsDNameEnv :: DNameEnv a -> [a] #

extendDNameEnv_C :: (a -> a -> a) -> DNameEnv a -> Name -> a -> DNameEnv a #

extendNameEnv :: NameEnv a -> Name -> a -> NameEnv a #

extendNameEnvList_C :: (a -> a -> a) -> NameEnv a -> [(Name, a)] -> NameEnv a #

extendNameEnv_Acc :: (a -> b -> b) -> (a -> b) -> NameEnv b -> Name -> a -> NameEnv b #

extendNameEnv_C :: (a -> a -> a) -> NameEnv a -> Name -> a -> NameEnv a #

filterDNameEnv :: (a -> Bool) -> DNameEnv a -> DNameEnv a #

filterNameEnv :: (elt -> Bool) -> NameEnv elt -> NameEnv elt #

foldDNameEnv :: (a -> b -> b) -> b -> DNameEnv a -> b #

isEmptyNameEnv :: NameEnv a -> Bool #

lookupDNameEnv :: DNameEnv a -> Name -> Maybe a #

mapDNameEnv :: (a -> b) -> DNameEnv a -> DNameEnv b #

mapMaybeNameEnv :: (a -> Maybe b) -> NameEnv a -> NameEnv b #

mapNameEnv :: (elt1 -> elt2) -> NameEnv elt1 -> NameEnv elt2 #

mkNameEnvWith :: (a -> Name) -> [a] -> NameEnv a #

nonDetStrictFoldDNameEnv :: (a -> b -> b) -> b -> DNameEnv a -> b #

plusDNameEnv_C :: (elt -> elt -> elt) -> DNameEnv elt -> DNameEnv elt -> DNameEnv elt #

plusNameEnv_C :: (a -> a -> a) -> NameEnv a -> NameEnv a -> NameEnv a #

plusNameEnv_CD :: (a -> a -> a) -> NameEnv a -> a -> NameEnv a -> a -> NameEnv a #

plusNameEnv_CD2 :: (Maybe a -> Maybe a -> a) -> NameEnv a -> NameEnv a -> NameEnv a #

seqEltsNameEnv :: (elt -> ()) -> NameEnv elt -> () #

unitNameEnv :: Name -> a -> NameEnv a #

hasKey :: Uniquable a => a -> Unique -> Bool #

allNameStringList :: [String] #

allNameStrings :: Infinite String #

all_RDR :: RdrName #

alt_RDR :: RdrName #

and_RDR :: RdrName #

ap_RDR :: RdrName #

append_RDR :: RdrName #

bindIO_RDR :: RdrName #

bindM_RDR :: RdrName #

bnbVarQual :: String -> Unique -> Name #

bniVarQual :: String -> Unique -> Name #

bnnVarQual :: String -> Unique -> Name #

build_RDR :: RdrName #

choose_RDR :: RdrName #

clsQual_RDR :: Module -> FastString -> RdrName #

comp1DataCon_RDR :: RdrName #

compare_RDR :: RdrName #

compose_RDR :: RdrName #

conFixity_RDR :: RdrName #

conIsRecord_RDR :: RdrName #

conName_RDR :: RdrName #

dataQual_RDR :: Module -> FastString -> RdrName #

dataToTag_RDR :: RdrName #

datatypeName_RDR :: RdrName #

enumClass_RDR :: RdrName #

enumFromThen_RDR :: RdrName #

enumFromTo_RDR :: RdrName #

enumFrom_RDR :: RdrName #

eqClass_RDR :: RdrName #

eqTag_RDR :: RdrName #

eq_RDR :: RdrName #

error_RDR :: RdrName #

expectP_RDR :: RdrName #

failM_RDR :: RdrName #

fmap_RDR :: RdrName #

foldMap_RDR :: RdrName #

foldr_RDR :: RdrName #

from1_RDR :: RdrName #

fromEnum_RDR :: RdrName #

fromInteger_RDR :: RdrName #

fromIntegral_RDR :: RdrName #

fromListN_RDR :: RdrName #

fromList_RDR :: RdrName #

fromRational_RDR :: RdrName #

fromString_RDR :: RdrName #

from_RDR :: RdrName #

ge_RDR :: RdrName #

gtTag_RDR :: RdrName #

gt_RDR :: RdrName #

ident_RDR :: RdrName #

inRange_RDR :: RdrName #

index_RDR :: RdrName #

infixDataCon_RDR :: RdrName #

integerAdd_RDR :: RdrName #

integerMul_RDR :: RdrName #

ioDataCon_RDR :: RdrName #

isNewtypeName_RDR :: RdrName #

k1DataCon_RDR :: RdrName #

l1DataCon_RDR :: RdrName #

le_RDR :: RdrName #

left_RDR :: RdrName #

lexP_RDR :: RdrName #

liftA2_RDR :: RdrName #

ltTag_RDR :: RdrName #

lt_RDR :: RdrName #

m1DataCon_RDR :: RdrName #

main_RDR_Unqual :: RdrName #

map_RDR :: RdrName #

mappend_RDR :: RdrName #

maxBound_RDR :: RdrName #

mempty_RDR :: RdrName #

minBound_RDR :: RdrName #

minus_RDR :: RdrName #

moduleName_RDR :: RdrName #

monadClass_RDR :: RdrName #

newStablePtr_RDR :: RdrName #

not_RDR :: RdrName #

null_RDR :: RdrName #

numClass_RDR :: RdrName #

ordClass_RDR :: RdrName #

packageName_RDR :: RdrName #

par1DataCon_RDR :: RdrName #

parens_RDR :: RdrName #

pfail_RDR :: RdrName #

plus_RDR :: RdrName #

prec_RDR :: RdrName #

pred_RDR :: RdrName #

prefixDataCon_RDR :: RdrName #

prodDataCon_RDR :: RdrName #

punc_RDR :: RdrName #

pure_RDR :: RdrName #

r1DataCon_RDR :: RdrName #

range_RDR :: RdrName #

ratioDataCon_RDR :: RdrName #

readFieldHash_RDR :: RdrName #

readField_RDR :: RdrName #

readListPrec_RDR :: RdrName #

readList_RDR :: RdrName #

readPrec_RDR :: RdrName #

readSymField_RDR :: RdrName #

rec1DataCon_RDR :: RdrName #

replace_RDR :: RdrName #

reset_RDR :: RdrName #

returnIO_RDR :: RdrName #

returnM_RDR :: RdrName #

right_RDR :: RdrName #

selName_RDR :: RdrName #

showParen_RDR :: RdrName #

showSpace_RDR :: RdrName #

showString_RDR :: RdrName #

showsPrec_RDR :: RdrName #

shows_RDR :: RdrName #

step_RDR :: RdrName #

succ_RDR :: RdrName #

symbol_RDR :: RdrName #

tcQual_RDR :: Module -> FastString -> RdrName #

times_RDR :: RdrName #

to1_RDR :: RdrName #

toEnum_RDR :: RdrName #

toInteger_RDR :: RdrName #

toList_RDR :: RdrName #

toRational_RDR :: RdrName #

to_RDR :: RdrName #

traverse_RDR :: RdrName #

u1DataCon_RDR :: RdrName #

uAddrDataCon_RDR :: RdrName #

uAddrHash_RDR :: RdrName #

uCharDataCon_RDR :: RdrName #

uCharHash_RDR :: RdrName #

uDoubleHash_RDR :: RdrName #

uFloatDataCon_RDR :: RdrName #

uFloatHash_RDR :: RdrName #

uIntDataCon_RDR :: RdrName #

uIntHash_RDR :: RdrName #

uWordDataCon_RDR :: RdrName #

uWordHash_RDR :: RdrName #

unComp1_RDR :: RdrName #

unK1_RDR :: RdrName #

unPar1_RDR :: RdrName #

unRec1_RDR :: RdrName #

unsafeIndex_RDR :: RdrName #

varQual_RDR :: Module -> FastString -> RdrName #

mkClass :: Name -> [TyVar] -> [FunDep TyVar] -> [PredType] -> [Id] -> [ClassATItem] -> [ClassOpItem] -> ClassMinimalDef -> TyCon -> Class #

mkVisFunTyMany :: HasDebugCallStack => Type -> Type -> Type #

mkAlgTyCon :: Name -> [TyConBinder] -> Kind -> [Role] -> Maybe CType -> [PredType] -> AlgTyConRhs -> AlgTyConFlav -> Bool -> TyCon #

mkDataTyConRhs :: [DataCon] -> AlgTyConRhs #

mkFamilyTyCon :: Name -> [TyConBinder] -> Kind -> Maybe Name -> FamTyConFlav -> Maybe Class -> Injectivity -> TyCon #

mkSumTyCon :: Name -> [TyConBinder] -> Kind -> [DataCon] -> AlgTyConFlav -> TyCon #

mkTcTyCon :: Name -> [TyConBinder] -> Kind -> [(Name, TcTyVar)] -> Bool -> TyConFlavour -> TyCon #

tyConDataCons :: TyCon -> [DataCon] #

getRuntimeRep :: HasDebugCallStack => Type -> RuntimeRepType #

linear :: a -> Scaled a #

splitTyConApp_maybe :: HasDebugCallStack => Type -> Maybe (TyCon, [Type]) #

tyConAppTyCon :: HasDebugCallStack => Type -> TyCon #

typeKind :: HasDebugCallStack => Type -> Kind #

binderVar :: VarBndr tv argf -> tv #

binderVars :: [VarBndr tv argf] -> [tv] #

mkTyVarBinders :: vis -> [TyVar] -> [VarBndr TyVar vis] #

boolTyCon_RDR :: RdrName #

cTupleDataCon :: Arity -> DataCon #

charDataCon :: DataCon #

charTyCon_RDR :: RdrName #

coercibleDataCon :: DataCon #

consDataCon :: DataCon #

consDataCon_RDR :: RdrName #

doubleDataCon :: DataCon #

eqDataCon :: DataCon #

eqTyCon_RDR :: RdrName #

falseDataCon :: DataCon #

false_RDR :: RdrName #

filterCTuple :: RdrName -> RdrName #

floatDataCon :: DataCon #

heqDataCon :: DataCon #

intDataCon :: DataCon #

intDataCon_RDR :: RdrName #

intTyCon_RDR :: RdrName #

integerINDataCon :: DataCon #

integerIPDataCon :: DataCon #

integerISDataCon :: DataCon #

isPromotedMaybeTy :: Type -> Maybe (Maybe Type) #

justDataCon :: DataCon #

listTyCon_RDR :: RdrName #

manyDataCon :: DataCon #

mkSumTy :: [Type] -> Type #

mkTupleStr :: Boxity -> NameSpace -> Arity -> String #

naturalNBDataCon :: DataCon #

naturalNSDataCon :: DataCon #

nilDataCon :: DataCon #

nothingDataCon :: DataCon #

oneDataCon :: DataCon #

ordEQDataCon :: DataCon #

ordGTDataCon :: DataCon #

ordLTDataCon :: DataCon #

stringTyCon_RDR :: RdrName #

sumDataCon :: ConTag -> Arity -> DataCon #

trueDataCon :: DataCon #

true_RDR :: RdrName #

tupleDataCon :: Boxity -> Arity -> DataCon #

unitDataCon :: DataCon #

word8DataCon :: DataCon #

wordDataCon :: DataCon #

chooseFunTyFlag :: HasDebugCallStack => Type -> Type -> FunTyFlag #

typeTypeOrConstraint :: HasDebugCallStack => Type -> TypeOrConstraint #

tyVarSpecToBinders :: [VarBndr a Specificity] -> [VarBndr a ForAllTyFlag] #

mkFunTy :: HasDebugCallStack => FunTyFlag -> Mult -> Type -> Type -> Type #

mkInvisFunTy :: HasDebugCallStack => Type -> Type -> Type #

cmpTyLit :: TyLit -> TyLit -> Ordering #

foldTyCo :: Monoid a => TyCoFolder env a -> env -> (Type -> a, [Type] -> a, Coercion -> a, [Coercion] -> a) #

mkInvisForAllTys :: [InvisTVBinder] -> Type -> Type #

mkInvisFunTys :: HasDebugCallStack => [Type] -> Type -> Type #

mkScaledFunTys :: HasDebugCallStack => [Scaled Type] -> Type -> Type #

mkVisFunTy :: HasDebugCallStack => Mult -> Type -> Type -> Type #

noView :: Type -> Maybe Type #

nonDetCmpTyLit :: TyLit -> TyLit -> Ordering #

scaledThing :: Scaled a -> a #

typeSize :: Type -> Int #

tcEqTyConApps :: TyCon -> [Type] -> TyCon -> [Type] -> Bool #

tcEqType :: HasDebugCallStack => Type -> Type -> Bool #

tyCoFVsVarBndrs :: [Var] -> FV -> FV #

tyCoVarsOfType :: Type -> TyCoVarSet #

isConcrete :: Type -> Bool #

piResultTys :: HasDebugCallStack => Type -> [Type] -> Type #

tcSplitTyConApp_maybe :: HasCallStack => Type -> Maybe (TyCon, [Type]) #

evId :: EvId -> EvExpr #

evVarPred :: EvVar -> PredType #

mkPhiTy :: HasDebugCallStack => [PredType] -> Type -> Type #

andCts :: Cts -> Cts -> Cts #

arisesFromGivens :: Ct -> Bool #

checkImplicationInvariants :: (HasCallStack, Applicative m) => Implication -> m () #

consCts :: Ct -> Cts -> Cts #

ctEqRel :: Ct -> EqRel #

ctEvCoercion :: HasDebugCallStack => CtEvidence -> TcCoercion #

ctEvEqRel :: CtEvidence -> EqRel #

ctEvEvId :: CtEvidence -> EvVar #

ctEvExpr :: HasDebugCallStack => CtEvidence -> EvExpr #

ctEvId :: HasDebugCallStack => Ct -> EvVar #

ctLoc :: Ct -> CtLoc #

ctsElts :: Cts -> [Ct] #

eqCanRewrite :: EqRel -> EqRel -> Bool #

extendCtsList :: Cts -> [Ct] -> Cts #

insolubleCt :: Ct -> Bool #

insolubleEqCt :: Ct -> Bool #

isEmptyCts :: Cts -> Bool #

isGiven :: CtEvidence -> Bool #

isGivenCt :: Ct -> Bool #

isGivenLoc :: CtLoc -> Bool #

isPendingScDict :: Ct -> Bool #

isWanted :: CtEvidence -> Bool #

isWantedCt :: Ct -> Bool #

listToCts :: [Ct] -> Cts #

mkGivens :: CtLoc -> [EvId] -> [Ct] #

pprEvVarTheta :: [EvVar] -> SDoc #

pprEvVarWithType :: EvVar -> SDoc #

pprEvVars :: [EvVar] -> SDoc #

setCtEvPredType :: HasDebugCallStack => CtEvidence -> Type -> CtEvidence #

snocCts :: Cts -> Ct -> Cts #

subGoalDepthExceeded :: DynFlags -> SubGoalDepth -> Bool #

wantedEvId_maybe :: Ct -> Maybe EvVar #

wrapType :: Type -> [TyVar] -> [PredType] -> Type #

eqType :: Type -> Type -> Bool #

funResultTy :: HasDebugCallStack => Type -> Type #

isCoVarType :: Type -> Bool #

isFunTy :: Type -> Bool #

mkFunctionType :: HasDebugCallStack => Mult -> Type -> Type -> Type #

piResultTy :: HasDebugCallStack => Type -> Type -> Type #

mkSingleAltCase :: CoreExpr -> Id -> AltCon -> [Var] -> CoreExpr -> CoreExpr #

mkSysLocalM :: MonadUnique m => FastString -> Mult -> Type -> m Id #

mkVanillaGlobalWithInfo :: Name -> Type -> IdInfo -> Id #

mkCoreApp :: SDoc -> CoreExpr -> CoreExpr -> CoreExpr #

mkCoreApps :: CoreExpr -> [CoreExpr] -> CoreExpr #

castBottomExpr :: CoreExpr -> Type -> CoreExpr #

chunkify :: [a] -> [[a]] #

mkAbsentErrorApp :: Type -> String -> CoreExpr #

mkBigCoreTup :: [CoreExpr] -> CoreExpr #

mkBigCoreVarTup :: [Id] -> CoreExpr #

mkBigCoreVarTupSolo :: [Id] -> CoreExpr #

mkBigTupleCase :: UniqSupply -> [Id] -> CoreExpr -> CoreExpr -> CoreExpr #

mkBigTupleSelector :: [Id] -> Id -> Id -> CoreExpr -> CoreExpr #

mkBigTupleSelectorSolo :: [Id] -> Id -> Id -> CoreExpr -> CoreExpr #

mkBuildExpr :: (MonadFail m, MonadThings m, MonadUnique m) => Type -> ((Id, Type) -> (Id, Type) -> m CoreExpr) -> m CoreExpr #

mkCharExpr :: Char -> CoreExpr #

mkConsExpr :: Type -> CoreExpr -> CoreExpr -> CoreExpr #

mkCoreConApps :: DataCon -> [CoreExpr] -> CoreExpr #

mkCoreLams :: [CoreBndr] -> CoreExpr -> CoreExpr #

mkCoreLet :: CoreBind -> CoreExpr -> CoreExpr #

mkCoreLets :: [CoreBind] -> CoreExpr -> CoreExpr #

mkCoreTup :: [CoreExpr] -> CoreExpr #

mkCoreTupBoxity :: Boxity -> [CoreExpr] -> CoreExpr #

mkCoreUnboxedSum :: Int -> Int -> [Type] -> CoreExpr -> CoreExpr #

mkCoreUnboxedTuple :: [CoreExpr] -> CoreExpr #

mkDoubleExpr :: Double -> CoreExpr #

mkFloatExpr :: Float -> CoreExpr #

mkFoldrExpr :: MonadThings m => Type -> Type -> CoreExpr -> CoreExpr -> CoreExpr -> m CoreExpr #

mkIfThenElse :: CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr #

mkImpossibleExpr :: Type -> String -> CoreExpr #

mkIntExpr :: Platform -> Integer -> CoreExpr #

mkIntExprInt :: Platform -> Int -> CoreExpr #

mkIntegerExpr :: Platform -> Integer -> CoreExpr #

mkJustExpr :: Type -> CoreExpr -> CoreExpr #

mkListExpr :: Type -> [CoreExpr] -> CoreExpr #

mkLitRubbish :: Type -> Maybe CoreExpr #

mkNaturalExpr :: Platform -> Integer -> CoreExpr #

mkNilExpr :: Type -> CoreExpr #

mkNothingExpr :: Type -> CoreExpr #

mkRuntimeErrorApp :: Id -> Type -> String -> CoreExpr #

mkStringExpr :: MonadThings m => String -> m CoreExpr #

mkStringExprFS :: MonadThings m => FastString -> m CoreExpr #

mkUncheckedIntExpr :: Integer -> CoreExpr #

mkWildCase :: CoreExpr -> Scaled Type -> Type -> [CoreAlt] -> CoreExpr #

mkWordExpr :: Platform -> Integer -> CoreExpr #

unitExpr :: CoreExpr #

wrapFloat :: FloatBind -> CoreExpr -> CoreExpr #

wrapFloats :: [FloatBind] -> CoreExpr -> CoreExpr #

classSCSelId :: Class -> Int -> Id #

unwrapNewTyCon_maybe :: TyCon -> Maybe ([TyVar], Type, CoAxiom Unbranched) #

evBindVar :: EvBind -> EvVar #

evDataConApp :: DataCon -> [Type] -> [EvExpr] -> EvTerm #

evSelector :: Id -> [Type] -> [EvExpr] -> EvExpr #

evVarsOfTerm :: EvTerm -> VarSet #

findNeededEvVars :: EvBindMap -> VarSet -> VarSet #

foldEvBindMap :: (EvBind -> a -> a) -> a -> EvBindMap -> a #

lookupEvBind :: EvBindMap -> EvVar -> Maybe EvBind #

mkWantedEvBind :: EvVar -> EvTerm -> EvBind #

mkWpEvVarApps :: [EvVar] -> HsWrapper #

nonDetStrictFoldEvBindMap :: (EvBind -> a -> a) -> a -> EvBindMap -> a #

pprHsWrapper :: HsWrapper -> (Bool -> SDoc) -> SDoc #

varSetMinusEvBindMap :: VarSet -> EvBindMap -> VarSet #

isStrictType :: HasDebugCallStack => Type -> Bool #

seqType :: Type -> () #

idDetails :: Id -> IdDetails #

idInfo :: HasDebugCallStack => Id -> IdInfo #

isExportedId :: Var -> Bool #

isGlobalId :: Var -> Bool #

isLocalId :: Var -> Bool #

lazySetIdInfo :: Id -> IdInfo -> Id #

setIdMult :: Id -> Mult -> Id #

updateIdTypeAndMultM :: Monad m => (Type -> m Type) -> Id -> m Id #

asJoinId_maybe :: Id -> Maybe JoinArity -> Id #

idCafInfo :: Id -> CafInfo #

setIdCprSig :: Id -> CprSig -> Id #

setIdDemandInfo :: Id -> Demand -> Id #

setIdDmdSig :: Id -> DmdSig -> Id #

setIdSpecialisation :: Id -> RuleInfo -> Id #

setIdUnfolding :: Id -> Unfolding -> Id #

hasNoBinding :: Id -> Bool #

idCoreRules :: Id -> [CoreRule] #

idCprSig :: Id -> CprSig #

idDataCon :: Id -> DataCon #

idDemandInfo :: Id -> Demand #

idDmdSig :: Id -> DmdSig #

idHasRules :: Id -> Bool #

idIsFrom :: Module -> Id -> Bool #

idLFInfo_maybe :: Id -> Maybe LambdaFormInfo #

idMult :: Id -> Mult #

idSpecialisation :: Id -> RuleInfo #

idTagSig_maybe :: Id -> Maybe TagSig #

isClassOpId :: Id -> Bool #

isConLikeId :: Id -> Bool #

isDFunId :: Id -> Bool #

isDataConId_maybe :: Id -> Maybe DataCon #

isDataConWorkId :: Id -> Bool #

isDataConWorkId_maybe :: Id -> Maybe DataCon #

isDataConWrapId :: Id -> Bool #

isDataConWrapId_maybe :: Id -> Maybe DataCon #

isDeadBinder :: Id -> Bool #

isDeadEndId :: Var -> Bool #

isFCallId :: Id -> Bool #

isFCallId_maybe :: Id -> Maybe ForeignCall #

isImplicitId :: Id -> Bool #

isJoinId :: Var -> Bool #

isPrimOpId :: Id -> Bool #

isPrimOpId_maybe :: Id -> Maybe PrimOp #

isRecordSelector :: Id -> Bool #

isStrictId :: Id -> Bool #

isWorkerLikeId :: Id -> Bool #

maybeModifyIdInfo :: Maybe IdInfo -> Id -> Id #

mkExportedLocalId :: IdDetails -> Name -> Type -> Id #

mkGlobalId :: IdDetails -> Name -> Type -> IdInfo -> Id #

mkLocalCoVar :: Name -> Type -> CoVar #

mkLocalId :: HasDebugCallStack => Name -> Mult -> Type -> Id #

mkLocalIdWithInfo :: HasDebugCallStack => Name -> Mult -> Type -> IdInfo -> Id #

mkSysLocalOrCoVarM :: MonadUnique m => FastString -> Mult -> Type -> m Id #

mkTemplateLocal :: Int -> Type -> Id #

mkTemplateLocalsNum :: Int -> [Type] -> [Id] #

mkWorkerId :: Unique -> Id -> Type -> Id #

modifyIdInfo :: HasDebugCallStack => (IdInfo -> IdInfo) -> Id -> Id #

realIdUnfolding :: Id -> Unfolding #

recordSelectorTyCon :: Id -> RecSelParent #

recordSelectorTyCon_maybe :: Id -> Maybe RecSelParent #

scaleIdBy :: Mult -> Id -> Id #

setCaseBndrEvald :: StrictnessMark -> Id -> Id #

setIdCafInfo :: Id -> CafInfo -> Id #

setIdInfo :: Id -> IdInfo -> Id #

setIdLFInfo :: Id -> LambdaFormInfo -> Id #

setIdName :: Id -> Name -> Id #

setIdTagSig :: Id -> TagSig -> Id #

setIdType :: Id -> Type -> Id #

transferPolyIdInfo :: Id -> [Var] -> Id -> Id #

classTvsFds :: Class -> ([TyVar], [FunDep TyVar]) #

orphNamesOfType :: Type -> NameSet #

orphNamesOfTypes :: [Type] -> NameSet #

instanceCantMatch :: [RoughMatchTc] -> [RoughMatchTc] -> Bool #

roughMatchTcs :: [Type] -> [RoughMatchTc] #

tyCoVarsOfTypes :: [Type] -> TyCoVarSet #

lookupTyVar :: Subst -> TyVar -> Maybe Type #

anyInstEnv :: (ClsInst -> Bool) -> InstEnv -> Bool #

fuzzyClsInstCmp :: ClsInst -> ClsInst -> Ordering #

instEnvClasses :: InstEnv -> UniqDSet Class #

instanceBindFun :: BindFun #

mkImportedInstance :: Name -> [RoughMatchTc] -> Name -> DFunId -> OverlapFlag -> IsOrphan -> ClsInst #

classHasFds :: Class -> Bool #

mkAbstractClass :: Name -> [TyVar] -> [FunDep TyVar] -> TyCon -> Class #

pprFunDep :: Outputable a => FunDep a -> SDoc #

pprFundeps :: Outputable a => [FunDep a] -> SDoc #

orphNamesOfCo :: Coercion -> NameSet #

orphNamesOfCoCon :: forall (br :: BranchFlag). CoAxiom br -> NameSet #

isEqPred :: PredType -> Bool #

isEqPredClass :: Class -> Bool #

isIPLikePred :: Type -> Bool #

eqTypeX :: RnEnv2 -> Type -> Type -> Bool #

eqTypes :: [Type] -> [Type] -> Bool #

eqVarBndrs :: RnEnv2 -> [Var] -> [Var] -> Maybe RnEnv2 #

nonDetCmpType :: Type -> Type -> Ordering #

nonDetCmpTypes :: [Type] -> [Type] -> Ordering #

pickyEqType :: Type -> Type -> Bool #

tcEqKind :: HasDebugCallStack => Kind -> Kind -> Bool #

tcEqTypeVis :: Type -> Type -> Bool #

closeOverKinds :: TyCoVarSet -> TyCoVarSet #

closeOverKindsDSet :: DTyVarSet -> DTyVarSet #

tyCoFVsOfTypes :: [Type] -> FV #

tyCoVarsOfTypeDSet :: Type -> DTyCoVarSet #

tyCoVarsOfTypesDSet :: [Type] -> DTyCoVarSet #

getSubstInScope :: Subst -> InScopeSet #

isInScope :: Var -> Subst -> Bool #

mkEmptySubst :: InScopeSet -> Subst #

mkSubst :: InScopeSet -> TvSubstEnv -> CvSubstEnv -> IdSubstEnv -> Subst #

mkTvSubst :: InScopeSet -> TvSubstEnv -> Subst #

notElemSubst :: Var -> Subst -> Bool #

substScaledTyUnchecked :: HasDebugCallStack => Subst -> Scaled Type -> Scaled Type #

substScaledTys :: HasDebugCallStack => Subst -> [Scaled Type] -> [Scaled Type] #

substTheta :: HasDebugCallStack => Subst -> ThetaType -> ThetaType #

substTy :: HasDebugCallStack => Subst -> Type -> Type #

substTyVarBndr :: HasDebugCallStack => Subst -> TyVar -> (Subst, TyVar) #

substTyWith :: HasDebugCallStack => [TyVar] -> [Type] -> Type -> Type #

substTyWithCoVars :: [CoVar] -> [Coercion] -> Type -> Type #

substTys :: HasDebugCallStack => Subst -> [Type] -> [Type] #

zipCoEnv :: HasDebugCallStack => [CoVar] -> [Coercion] -> CvSubstEnv #

zipTvSubst :: HasDebugCallStack => [TyVar] -> [Type] -> Subst #

zipTyEnv :: HasDebugCallStack => [TyVar] -> [Type] -> TvSubstEnv #

isNewTyCon :: TyCon -> Bool #

isPrimTyCon :: TyCon -> Bool #

isTauTyCon :: TyCon -> Bool #

isVisibleTyConBinder :: VarBndr tv TyConBndrVis -> Bool #

coreView :: Type -> Maybe Type #

getTyVar :: HasDebugCallStack => Type -> TyVar #

isFixedRuntimeRepKind :: HasDebugCallStack => Kind -> Bool #

isForAllTy :: Type -> Bool #

isPredTy :: HasDebugCallStack => Type -> Bool #

isTauTy :: Type -> Bool #

isTyVarTy :: Type -> Bool #

mkAppTys :: Type -> [Type] -> Type #

splitForAllInvisTyBinders :: Type -> ([InvisTyBinder], Type) #

splitForAllReqTyBinders :: Type -> ([ReqTyBinder], Type) #

unkSkol :: HasCallStack => SkolemInfo #

binderType :: VarBndr TyCoVar argf -> Type #

mkForAllTyBinders :: vis -> [TyCoVar] -> [VarBndr TyCoVar vis] #

allDistinctTyVars :: TyVarSet -> [KindOrType] -> Bool #

anyRewritableTyFamApp :: EqRel -> (EqRel -> TyCon -> [TcType] -> Bool) -> TcType -> Bool #

anyRewritableTyVar :: EqRel -> (EqRel -> TcTyVar -> Bool) -> TcType -> Bool #

boxEqPred :: EqRel -> Type -> Type -> Maybe (Class, [Type]) #

checkValidClsArgs :: Bool -> Class -> [KindOrType] -> Bool #

exactTyCoVarsOfType :: Type -> TyCoVarSet #

exactTyCoVarsOfTypes :: [Type] -> TyCoVarSet #

hasTyVarHead :: Type -> Bool #

isBoolTy :: Type -> Bool #

isCharTy :: Type -> Bool #

isDoubleTy :: Type -> Bool #

isFFIArgumentTy :: DynFlags -> Safety -> Type -> Validity' IllegalForeignTypeReason #

isFFIPrimResultTy :: DynFlags -> Type -> Validity' IllegalForeignTypeReason #

isFlexi :: MetaDetails -> Bool #

isFloatTy :: Type -> Bool #

isFunPtrTy :: Type -> Bool #

isIntTy :: Type -> Bool #

isIntegerTy :: Type -> Bool #

isMetaTyVar :: TcTyVar -> Bool #

isNaturalTy :: Type -> Bool #

isOverloadedTy :: Type -> Bool #

isRhoExpTy :: ExpType -> Bool #

isRhoTy :: TcType -> Bool #

isRigidTy :: TcType -> Bool #

isSigmaTy :: TcType -> Bool #

isStringTy :: Type -> Bool #

isTyFamFree :: Type -> Bool #

isTyVarTyVar :: Var -> Bool #

isUnitTy :: Type -> Bool #

isWordTy :: Type -> Bool #

mkInfSigmaTy :: HasDebugCallStack => [TyCoVar] -> [PredType] -> Type -> Type #

mkMinimalBySCs :: (a -> PredType) -> [a] -> [a] #

mkSigmaTy :: HasDebugCallStack => [ForAllTyBinder] -> [PredType] -> Type -> Type #

mkSpecSigmaTy :: HasDebugCallStack => [TyVar] -> [PredType] -> Type -> Type #

noMoreTyVars :: [TyVar] -> [TyVar] -> [TyVar] #

pSizeClassPredX :: VarSet -> Class -> [Type] -> PatersonSize #

pSizeTypeX :: VarSet -> Type -> PatersonSize #

tcFunResultTyN :: HasDebugCallStack => Arity -> Type -> Type #

tcIsTcTyVar :: TcTyVar -> Bool #

tcIsTyVarTy :: Type -> Bool #

tcMkDFunPhiTy :: HasDebugCallStack => [PredType] -> Type -> Type #

tcMkPhiTy :: HasDebugCallStack => [PredType] -> Type -> Type #

tcSplitPiTy_maybe :: Type -> Maybe (PiTyVarBinder, Type) #

tcSplitPiTys :: Type -> ([PiTyVarBinder], Type) #

tcTyFamInstsAndVis :: Type -> [(Bool, TyCon, [Type])] #

anyFreeVarsOfType :: (TyCoVar -> Bool) -> Type -> Bool #

anyFreeVarsOfTypes :: (TyCoVar -> Bool) -> [Type] -> Bool #

coVarsOfType :: Type -> CoVarSet #

coVarsOfTypes :: [Type] -> CoVarSet #

occCheckExpand :: [Var] -> Type -> Maybe Type #

tyCoFVsVarBndr :: Var -> FV -> FV #

cloneTyVarBndrs :: Subst -> [TyVar] -> UniqSupply -> (Subst, [TyVar]) #

extendCvSubst :: Subst -> CoVar -> Coercion -> Subst #

isEmptySubst :: Subst -> Bool #

setInScope :: Subst -> InScopeSet -> Subst #

substCo :: HasDebugCallStack => Subst -> Coercion -> Coercion #

substScaledTy :: HasDebugCallStack => Subst -> Scaled Type -> Scaled Type #

substTyVarBndrs :: HasDebugCallStack => Subst -> [TyVar] -> (Subst, [TyVar]) #

substTyVarToTyVar :: HasDebugCallStack => Subst -> TyVar -> TyVar #

substTysWith :: [TyVar] -> [Type] -> [Type] -> [Type] #

substVarBndr :: HasDebugCallStack => Subst -> TyCoVar -> (Subst, TyCoVar) #

substVarBndrs :: HasDebugCallStack => Subst -> [TyCoVar] -> (Subst, [TyCoVar]) #

zipTCvSubst :: HasDebugCallStack => [TyCoVar] -> [Type] -> Subst #

tidyForAllTyBinder :: TidyEnv -> VarBndr TyCoVar vis -> (TidyEnv, VarBndr TyCoVar vis) #

tidyForAllTyBinders :: TidyEnv -> [VarBndr TyCoVar vis] -> (TidyEnv, [VarBndr TyCoVar vis]) #

tidyFreeTyCoVars :: TidyEnv -> [TyCoVar] -> TidyEnv #

tidyOpenTyCoVar :: TidyEnv -> TyCoVar -> (TidyEnv, TyCoVar) #

tidyOpenTyCoVars :: TidyEnv -> [TyCoVar] -> (TidyEnv, [TyCoVar]) #

tidyOpenType :: TidyEnv -> Type -> (TidyEnv, Type) #

tidyOpenTypes :: TidyEnv -> [Type] -> (TidyEnv, [Type]) #

tidyTyCoVarOcc :: TidyEnv -> TyCoVar -> TyCoVar #

tidyType :: TidyEnv -> Type -> Type #

tidyTypes :: TidyEnv -> [Type] -> [Type] #

tidyVarBndr :: TidyEnv -> TyCoVar -> (TidyEnv, TyCoVar) #

tidyVarBndrs :: TidyEnv -> [TyCoVar] -> (TidyEnv, [TyCoVar]) #

isAlgTyCon :: TyCon -> Bool #

isTcTyCon :: TyCon -> Bool #

mkSynonymTyCon :: Name -> [TyConBinder] -> Kind -> [Role] -> Type -> Bool -> Bool -> Bool -> TyCon #

binderFlag :: VarBndr tv argf -> argf #

binderFlags :: [VarBndr tv argf] -> [argf] #

mkForAllTyBinder :: vis -> TyCoVar -> VarBndr TyCoVar vis #

mkTyVarBinder :: vis -> TyVar -> VarBndr TyVar vis #

applyTysX :: HasDebugCallStack => [TyVar] -> Type -> [Type] -> Type #

coAxNthLHS :: forall (br :: BranchFlag). CoAxiom br -> Int -> Type #

getLevity :: HasDebugCallStack => Type -> Type #

isAlgType :: Type -> Bool #

isAtomicTy :: Type -> Bool #

isBoxedType :: Type -> Bool #

isCharLitTy :: Type -> Maybe Char #

isCoercionTy :: Type -> Bool #

isFamFreeTy :: Type -> Bool #

isForAllTy_co :: Type -> Bool #

isForAllTy_ty :: Type -> Bool #

isLevityTy :: Type -> Bool #

isLevityVar :: TyVar -> Bool #

isLiftedLevity :: Type -> Bool #

isLinearType :: Type -> Bool #

isLitTy :: Type -> Maybe TyLit #

isManyTy :: Mult -> Bool #

isNumLitTy :: Type -> Maybe Integer #

isOneTy :: Mult -> Bool #

isPiTy :: Type -> Bool #

isRuntimeRepTy :: Type -> Bool #

isTypeLikeKind :: Kind -> Bool #

kindRep :: HasDebugCallStack => Kind -> RuntimeRepType #

kindRep_maybe :: HasDebugCallStack => Kind -> Maybe RuntimeRepType #

mapTyCo :: Monad m => TyCoMapper () m -> (Type -> m Type, [Type] -> m [Type], Coercion -> m Coercion, [Coercion] -> m [Coercion]) #

mapTyCoX :: Monad m => TyCoMapper env m -> (env -> Type -> m Type, env -> [Type] -> m [Type], env -> Coercion -> m Coercion, env -> [Coercion] -> m [Coercion]) #

mkCharLitTy :: Char -> Type #

mkNumLitTy :: Integer -> Type #

mkScaled :: Mult -> a -> Scaled a #

partitionInvisibles :: [(a, ForAllTyFlag)] -> ([a], [a]) #

scaledSet :: Scaled a -> b -> Scaled b #

seqTypes :: [Type] -> () #

splitAppTyNoView_maybe :: HasDebugCallStack => Type -> Maybe (Type, Type) #

splitAppTysNoView :: HasDebugCallStack => Type -> (Type, [Type]) #

splitForAllCoVar_maybe :: Type -> Maybe (CoVar, Type) #

tyConAppArgs :: HasCallStack => Type -> [Type] #

tyConAppFunCo_maybe :: HasDebugCallStack => Role -> TyCon -> [Coercion] -> Maybe Coercion #

tyConAppFunTy_maybe :: HasDebugCallStack => TyCon -> [Type] -> Maybe Type #

tyConAppNeedsKindSig :: Bool -> TyCon -> Int -> Bool #

tymult :: a -> Scaled a #

typeHasFixedRuntimeRep :: HasDebugCallStack => Type -> Bool #

typeLevity_maybe :: HasDebugCallStack => Type -> Maybe Levity #

algTcFields :: TyConDetails -> FieldLabelEnv #

isBuiltInSynFamTyCon_maybe :: TyCon -> Maybe BuiltInSynFamily #

isClassTyCon :: TyCon -> Bool #

isClosedSynFamilyTyConWithAxiom_maybe :: TyCon -> Maybe (CoAxiom Branched) #

isDataTyCon :: TyCon -> Bool #

isFamilyTyCon :: TyCon -> Bool #

isGcPtrRep :: PrimRep -> Bool #

isInvisibleTyConBinder :: VarBndr tv TyConBndrVis -> Bool #

isKindTyCon :: TyCon -> Bool #

isMonoTcTyCon :: TyCon -> Bool #

isPromotedDataCon_maybe :: TyCon -> Maybe DataCon #

isTupleTyCon :: TyCon -> Bool #

isTyConAssoc :: TyCon -> Bool #

isVoidRep :: PrimRep -> Bool #

lookupTyConFieldLabel :: FieldLabelString -> TyCon -> Maybe FieldLabel #

mkLevPolyDataTyConRhs :: Bool -> Bool -> [DataCon] -> AlgTyConRhs #

newTyConCo :: TyCon -> CoAxiom Unbranched #

newTyConCo_maybe :: TyCon -> Maybe (CoAxiom Unbranched) #

newTyConDataCon_maybe :: TyCon -> Maybe DataCon #

primElemRepSizeB :: Platform -> PrimElemRep -> Int #

primRepCompatible :: Platform -> PrimRep -> PrimRep -> Bool #

primRepIsFloat :: PrimRep -> Maybe Bool #

primRepSizeB :: Platform -> PrimRep -> Int #

primRepsCompatible :: Platform -> [PrimRep] -> [PrimRep] -> Bool #

tyConAlgDataCons_maybe :: TyCon -> Maybe [DataCon] #

tyConCType_maybe :: TyCon -> Maybe CType #

tyConDataCons_maybe :: TyCon -> Maybe [DataCon] #

tyConFamInstSig_maybe :: TyCon -> Maybe (TyCon, [Type], CoAxiom Unbranched) #

tyConFamilyCoercion_maybe :: TyCon -> Maybe (CoAxiom Unbranched) #

tyConFieldLabels :: TyCon -> [FieldLabel] #

tyConInvisTVBinders :: [TyConBinder] -> [InvisTVBinder] #

tyConSingleAlgDataCon_maybe :: TyCon -> Maybe DataCon #

tyConSingleDataCon :: TyCon -> DataCon #

tyConSingleDataCon_maybe :: TyCon -> Maybe DataCon #

tyConSkolem :: TyCon -> Bool #

unwrapNewTyConEtad_maybe :: TyCon -> Maybe ([TyVar], Type, CoAxiom Unbranched) #

visibleDataCons :: AlgTyConRhs -> [DataCon] #

pprFamInst :: FamInst -> SDoc #

pprTyThing :: ShowSub -> TyThing -> SDoc #

pprTyThingHdr :: TyThing -> SDoc #

pprTyThingInContext :: ShowSub -> TyThing -> SDoc #

pprTyThingLoc :: TyThing -> SDoc #

isAtomicHsExpr :: forall (p :: Pass). IsPass p => HsExpr (GhcPass p) -> Bool #

pp_rhs :: Outputable body => HsMatchContext passL -> body -> SDoc #

pprArg :: forall (idL :: Pass). OutputableBndrId idL => ApplicativeArg (GhcPass idL) -> SDoc #

pprArrowExpr :: forall (p :: Pass) body. (OutputableBndrId p, Outputable body, Anno (StmtLR (GhcPass p) (GhcPass p) body) ~ SrcSpanAnnA) => [LStmt (GhcPass p) body] -> SDoc #

pprBindStmt :: (Outputable pat, Outputable expr) => pat -> expr -> SDoc #

pprBinds :: forall (idL :: Pass) (idR :: Pass). (OutputableBndrId idL, OutputableBndrId idR) => HsLocalBindsLR (GhcPass idL) (GhcPass idR) -> SDoc #

pprCmd :: forall (p :: Pass). OutputableBndrId p => HsCmd (GhcPass p) -> SDoc #

pprDo :: forall (p :: Pass) body. (OutputableBndrId p, Outputable body, Anno (StmtLR (GhcPass p) (GhcPass p) body) ~ SrcSpanAnnA) => HsDoFlavour -> [LStmt (GhcPass p) body] -> SDoc #

pprFieldLabelStrings :: (UnXRec p, Outputable (XRec p FieldLabelString)) => FieldLabelStrings p -> SDoc #

pprGRHS :: forall (idR :: Pass) body passL. (OutputableBndrId idR, Outputable body) => HsMatchContext passL -> GRHS (GhcPass idR) body -> SDoc #

pprGRHSs :: forall (idR :: Pass) body passL. (OutputableBndrId idR, Outputable body) => HsMatchContext passL -> GRHSs (GhcPass idR) body -> SDoc #

pprMatch :: forall (idR :: Pass) body. (OutputableBndrId idR, Outputable body) => Match (GhcPass idR) body -> SDoc #

pprMatches :: forall (idR :: Pass) body. (OutputableBndrId idR, Outputable body) => MatchGroup (GhcPass idR) body -> SDoc #

pprParendExpr :: forall (p :: Pass). OutputableBndrId p => PprPrec -> HsExpr (GhcPass p) -> SDoc #

pprStmt :: forall (idL :: Pass) (idR :: Pass) body. (OutputableBndrId idL, OutputableBndrId idR, Anno (StmtLR (GhcPass idL) (GhcPass idR) body) ~ SrcSpanAnnA, Outputable body) => StmtLR (GhcPass idL) (GhcPass idR) body -> SDoc #

pprTransStmt :: Outputable body => Maybe body -> body -> TransForm -> SDoc #

pprUntypedSplice :: forall (p :: Pass). OutputableBndrId p => Bool -> Maybe SplicePointName -> HsUntypedSplice (GhcPass p) -> SDoc #

ppr_apps :: forall (p :: Pass). OutputableBndrId p => HsExpr (GhcPass p) -> [Either (LHsExpr (GhcPass p)) (LHsWcType (NoGhcTc (GhcPass p)))] -> SDoc #

ppr_cmd :: forall (p :: Pass). OutputableBndrId p => HsCmd (GhcPass p) -> SDoc #

ppr_expr :: forall (p :: Pass). OutputableBndrId p => HsExpr (GhcPass p) -> SDoc #

ppr_infix_expr :: forall (p :: Pass). OutputableBndrId p => HsExpr (GhcPass p) -> Maybe SDoc #

ppr_lcmd :: forall (p :: Pass). OutputableBndrId p => LHsCmd (GhcPass p) -> SDoc #

ppr_lexpr :: forall (p :: Pass). OutputableBndrId p => LHsExpr (GhcPass p) -> SDoc #

hsLMatchPats :: forall (id :: Pass) body. LMatch (GhcPass id) body -> [LPat (GhcPass id)] #

isEmptyMatchGroup :: forall (p :: Pass) body. MatchGroup (GhcPass p) body -> Bool #

isQuietHsCmd :: HsCmd id -> Bool #

isQuietHsExpr :: HsExpr id -> Bool #

isSingletonMatchGroup :: forall (p :: Pass) body. [LMatch (GhcPass p) body] -> Bool #

matchGroupArity :: forall (id :: Pass) body. MatchGroup (GhcPass id) body -> Arity #

pprBy :: Outputable body => Maybe body -> SDoc #

pprCmdArg :: forall (p :: Pass). OutputableBndrId p => HsCmdTop (GhcPass p) -> SDoc #

pprComp :: forall (p :: Pass) body. (OutputableBndrId p, Outputable body, Anno (StmtLR (GhcPass p) (GhcPass p) body) ~ SrcSpanAnnA) => [LStmt (GhcPass p) body] -> SDoc #

pprExternalSrcLoc :: (StringLiteral, (Int, Int), (Int, Int)) -> SDoc #

pprLCmd :: forall (p :: Pass). OutputableBndrId p => LHsCmd (GhcPass p) -> SDoc #

pprLExpr :: forall (p :: Pass). OutputableBndrId p => LHsExpr (GhcPass p) -> SDoc #

pprMatchInCtxt :: forall (idR :: Pass) body. (OutputableBndrId idR, Outputable body) => Match (GhcPass idR) body -> SDoc #

pprParendLExpr :: forall (p :: Pass). OutputableBndrId p => PprPrec -> LHsExpr (GhcPass p) -> SDoc #

pprQuals :: forall (p :: Pass) body. (OutputableBndrId p, Outputable body, Anno (StmtLR (GhcPass p) (GhcPass p) body) ~ SrcSpanAnnA) => [LStmt (GhcPass p) body] -> SDoc #

pprStmtCat :: forall (p :: Pass) body. Stmt (GhcPass p) body -> SDoc #

pprStmtInCtxt :: forall (idL :: Pass) (idR :: Pass) (ctx :: Pass) body. (OutputableBndrId idL, OutputableBndrId idR, OutputableBndrId ctx, Outputable body, Anno (StmtLR (GhcPass idL) (GhcPass idR) body) ~ SrcSpanAnnA) => HsStmtContext (GhcPass ctx) -> StmtLR (GhcPass idL) (GhcPass idR) body -> SDoc #

pprTransformStmt :: forall (p :: Pass). OutputableBndrId p => [IdP (GhcPass p)] -> LHsExpr (GhcPass p) -> Maybe (LHsExpr (GhcPass p)) -> SDoc #

pprTypedSplice :: forall (p :: Pass). OutputableBndrId p => Maybe SplicePointName -> LHsExpr (GhcPass p) -> SDoc #

ppr_do_stmts :: forall (idL :: Pass) (idR :: Pass) body. (OutputableBndrId idL, OutputableBndrId idR, Anno (StmtLR (GhcPass idL) (GhcPass idR) body) ~ SrcSpanAnnA, Outputable body) => [LStmtLR (GhcPass idL) (GhcPass idR) body] -> SDoc #

ppr_splice :: forall (p :: Pass). OutputableBndrId p => SDoc -> Maybe SplicePointName -> LHsExpr (GhcPass p) -> SDoc #

stripParensHsExpr :: forall (p :: Pass). HsExpr (GhcPass p) -> HsExpr (GhcPass p) #

stripParensLHsExpr :: forall (p :: Pass). LHsExpr (GhcPass p) -> LHsExpr (GhcPass p) #

tupArgPresent :: forall (p :: Pass). HsTupArg (GhcPass p) -> Bool #

unkSkolAnon :: HasCallStack => SkolemInfoAnon #

pattern HsLet' :: XLet GhcRn -> LetToken -> HsLocalBinds GhcRn -> InToken -> LHsExpr GhcRn -> HsExpr GhcRn Source #

pattern CDictCan' :: CtEvidence -> Class -> [Xi] -> Ct Source #