ghc-9.2.0.20210422: The GHC API
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.Haskell.Syntax.Extension

Synopsis

Documentation

data NoExtField Source #

A placeholder type for TTG extension points that are not currently unused to represent any particular value.

This should not be confused with NoExtCon, which are found in unused extension constructors and therefore should never be inhabited. In contrast, NoExtField is used in extension points (e.g., as the field of some constructor), so it must have an inhabitant to construct AST passes that manipulate fields with that extension point as their type.

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 Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoExtField Source #

toConstr :: NoExtField -> Constr Source #

dataTypeOf :: NoExtField -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoExtField) Source #

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

gmapT :: (forall b. Data b => b -> b) -> NoExtField -> NoExtField Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> NoExtField -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoExtField -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField Source #

Outputable NoExtField # 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

ppr :: NoExtField -> SDoc Source #

Eq NoExtField # 
Instance details

Defined in Language.Haskell.Syntax.Extension

Ord NoExtField # 
Instance details

Defined in Language.Haskell.Syntax.Extension

noExtField :: NoExtField Source #

Used when constructing a term with an unused extension point.

data NoExtCon Source #

Used in TTG extension constructors that have yet to be extended with anything. If an extension constructor has NoExtCon as its field, it is not intended to ever be constructed anywhere, and any function that consumes the extension constructor can eliminate it by way of noExtCon.

This should not be confused with NoExtField, which are found in unused extension points (not constructors) and therefore can be inhabited.

Instances

Instances details
Data NoExtCon # 
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) -> NoExtCon -> c NoExtCon Source #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoExtCon Source #

toConstr :: NoExtCon -> Constr Source #

dataTypeOf :: NoExtCon -> DataType Source #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoExtCon) Source #

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

gmapT :: (forall b. Data b => b -> b) -> NoExtCon -> NoExtCon Source #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoExtCon -> r Source #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoExtCon -> r Source #

gmapQ :: (forall d. Data d => d -> u) -> NoExtCon -> [u] Source #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoExtCon -> u Source #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoExtCon -> m NoExtCon Source #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtCon -> m NoExtCon Source #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtCon -> m NoExtCon Source #

Outputable NoExtCon # 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

ppr :: NoExtCon -> SDoc Source #

Eq NoExtCon # 
Instance details

Defined in Language.Haskell.Syntax.Extension

Ord NoExtCon # 
Instance details

Defined in Language.Haskell.Syntax.Extension

noExtCon :: NoExtCon -> a Source #

Eliminate a NoExtCon. Much like absurd.

type family XRec p a = r | r -> a Source #

GHC's L prefixed variants wrap their vanilla variant in this type family, to add SrcLoc info via Located. Other passes than GhcPass not interested in location information can define this as type instance XRec NoLocated a = a. See Note [XRec and SrcSpans in the AST]

Instances

Instances details
type XRec (GhcPass p) a # 
Instance details

Defined in GHC.Hs.Extension

type XRec (GhcPass p) a = GenLocated (Anno a) a

type family Anno a = b Source #

Instances

Instances details
type Anno ConLike # 
Instance details

Defined in GHC.Hs.Pat

type Anno OverlapMode # 
Instance details

Defined in GHC.Hs.Decls

type Anno OverlapMode # 
Instance details

Defined in GHC.Hs.Decls

type Anno CType # 
Instance details

Defined in GHC.Hs.Decls

type Anno Name # 
Instance details

Defined in GHC.Hs.Extension

type Anno RdrName # 
Instance details

Defined in GHC.Hs.Extension

type Anno StringLiteral # 
Instance details

Defined in GHC.Hs.Binds

type Anno Id # 
Instance details

Defined in GHC.Hs.Extension

type Anno ModuleName # 
Instance details

Defined in GHC.Hs.ImpExp

type Anno DocDecl # 
Instance details

Defined in GHC.Hs.Decls

type Anno HsIPName # 
Instance details

Defined in GHC.Hs.Type

type Anno Bool # 
Instance details

Defined in GHC.Hs.Decls

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

Defined in GHC.Hs.ImpExp

type Anno (IE (GhcPass p)) = SrcSpanAnnA
type Anno (ImportDecl (GhcPass p)) # 
Instance details

Defined in GHC.Hs.ImpExp

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 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 (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 (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 (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 (HsSplice (GhcPass p)) # 
Instance details

Defined in GHC.Hs.Expr

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 GhcTc) # 
Instance details

Defined in GHC.Hs.Pat

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) # 
Instance details

Defined in GHC.Hs.Decls

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 (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 (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 (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 GhcPs GhcPs (LocatedA (PatBuilder GhcPs)))] # 
Instance details

Defined in GHC.Parser.Types

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 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 (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 (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 (HsRecField (GhcPass p) arg) # 
Instance details

Defined in GHC.Hs.Pat

type Anno (HsRecField' (GhcPass p) (LocatedA (HsExpr (GhcPass p)))) # 
Instance details

Defined in GHC.Hs.Pat

type Anno (HsRecField' (AmbiguousFieldOcc p) (LocatedA (HsExpr p))) # 
Instance details

Defined in GHC.Hs.Pat

type Anno (HsRecField' p arg) # 
Instance details

Defined in GHC.Hs.Pat

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) # 
Instance details

Defined in GHC.Hs.Decls

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

Defined in GHC.Hs.Expr

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

Defined in GHC.Hs.Expr

type Anno (StmtLR GhcPs GhcPs (LocatedA (PatBuilder GhcPs))) # 
Instance details

Defined in GHC.Parser.PostProcess

type Anno (StmtLR GhcRn GhcRn (LocatedA (body GhcRn))) # 
Instance details

Defined in GHC.Hs.Expr

class UnXRec p where Source #

We can strip off the XRec to access the underlying data. See Note [XRec and SrcSpans in the AST]

Methods

unXRec :: XRec p a -> a Source #

Instances

Instances details
UnXRec (GhcPass p) # 
Instance details

Defined in GHC.Hs.Extension

Methods

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

class MapXRec p where Source #

We can map over the underlying type contained in an XRec while preserving the annotation as is.

Methods

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

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 Source #

class WrapXRec p a where Source #

The trivial wrapper that carries no additional information See Note [XRec and SrcSpans in the AST]

Methods

wrapXRec :: a -> XRec p a Source #

Instances

Instances details
Anno a ~ SrcSpanAnn' (EpAnn an) => WrapXRec (GhcPass p) a # 
Instance details

Defined in GHC.Hs.Expr

Methods

wrapXRec :: a -> XRec (GhcPass p) a Source #

type family IdP p Source #

Maps the "normal" id type for a given pass

Instances

Instances details
type IdP (GhcPass p) # 
Instance details

Defined in GHC.Hs.Extension

type IdP (GhcPass p) = IdGhcP p

type LIdP p = XRec p (IdP p) Source #

type family XHsValBinds x x' Source #

Instances

Instances details
type XHsValBinds (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XHsIPBinds x x' Source #

Instances

Instances details
type XHsIPBinds (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XEmptyLocalBinds x x' Source #

Instances

Instances details
type XEmptyLocalBinds (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XXHsLocalBindsLR x x' Source #

Instances

Instances details
type XXHsLocalBindsLR (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XValBinds x x' Source #

Instances

Instances details
type XValBinds (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XXValBindsLR x x' Source #

Instances

Instances details
type XXValBindsLR (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XFunBind x x' Source #

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) GhcTc # 
Instance details

Defined in GHC.Hs.Binds

type family XPatBind x x' Source #

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 GhcTc (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XVarBind x x' Source #

Instances

Instances details
type XVarBind (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XAbsBinds x x' Source #

Instances

Instances details
type XAbsBinds (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XPatSynBind x x' Source #

Instances

Instances details
type XPatSynBind (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XXHsBindsLR x x' Source #

Instances

Instances details
type XXHsBindsLR (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Binds

type family XABE x Source #

Instances

Instances details
type XABE (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XXABExport x Source #

Instances

Instances details
type XXABExport (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XPSB x x' Source #

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 XXPatSynBind x x' Source #

Instances

Instances details
type XXPatSynBind (GhcPass idL) (GhcPass idR) # 
Instance details

Defined in GHC.Hs.Binds

type family XIPBinds x Source #

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 XXHsIPBinds x Source #

Instances

Instances details
type XXHsIPBinds (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XCIPBind x Source #

Instances

Instances details
type XCIPBind (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XXIPBind x Source #

Instances

Instances details
type XXIPBind (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XTypeSig x Source #

Instances

Instances details
type XTypeSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XPatSynSig x Source #

Instances

Instances details
type XPatSynSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XClassOpSig x Source #

Instances

Instances details
type XClassOpSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XIdSig x Source #

Instances

Instances details
type XIdSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XFixSig x Source #

Instances

Instances details
type XFixSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XInlineSig x Source #

Instances

Instances details
type XInlineSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XSpecSig x Source #

Instances

Instances details
type XSpecSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XSpecInstSig x Source #

Instances

Instances details
type XSpecInstSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XMinimalSig x Source #

Instances

Instances details
type XMinimalSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XSCCFunSig x Source #

Instances

Instances details
type XSCCFunSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XCompleteMatchSig x Source #

Instances

Instances details
type XCompleteMatchSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XXSig x Source #

Instances

Instances details
type XXSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XFixitySig x Source #

Instances

Instances details
type XFixitySig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XXFixitySig x Source #

Instances

Instances details
type XXFixitySig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Binds

type family XStandaloneKindSig x Source #

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

type family XXStandaloneKindSig x Source #

Instances

Instances details
type XXStandaloneKindSig (GhcPass p) # 
Instance details

Defined in GHC.Hs.Decls

type family XTyClD x Source #

Instances

Instances details
type XTyClD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XInstD x Source #

Instances

Instances details
type XInstD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDerivD x Source #

Instances

Instances details
type XDerivD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XValD x Source #

Instances

Instances details
type XValD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XSigD x Source #

Instances

Instances details
type XSigD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XKindSigD x Source #

Instances

Instances details
type XKindSigD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDefD x Source #

Instances

Instances details
type XDefD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XForD x Source #

Instances

Instances details
type XForD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XWarningD x Source #

Instances

Instances details
type XWarningD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XAnnD x Source #

Instances

Instances details
type XAnnD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XRuleD x Source #

Instances

Instances details
type XRuleD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XSpliceD x Source #

Instances

Instances details
type XSpliceD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDocD x Source #

Instances

Instances details
type XDocD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XRoleAnnotD x Source #

Instances

Instances details
type XRoleAnnotD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXHsDecl x Source #

Instances

Instances details
type XXHsDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCHsGroup x Source #

Instances

Instances details
type XCHsGroup (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXHsGroup x Source #

Instances

Instances details
type XXHsGroup (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XSpliceDecl x Source #

Instances

Instances details
type XSpliceDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXSpliceDecl x Source #

Instances

Instances details
type XXSpliceDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XFamDecl x Source #

Instances

Instances details
type XFamDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XSynDecl x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XDataDecl x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XClassDecl x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XXTyClDecl x Source #

Instances

Instances details
type XXTyClDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCFunDep x Source #

Instances

Instances details
type XCFunDep (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXFunDep x Source #

Instances

Instances details
type XXFunDep (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCTyClGroup x Source #

Instances

Instances details
type XCTyClGroup (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXTyClGroup x Source #

Instances

Instances details
type XXTyClGroup (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XNoSig x Source #

Instances

Instances details
type XNoSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCKindSig x Source #

Instances

Instances details
type XCKindSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XTyVarSig x Source #

Instances

Instances details
type XTyVarSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXFamilyResultSig x Source #

Instances

Instances details
type XXFamilyResultSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCFamilyDecl x Source #

Instances

Instances details
type XCFamilyDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXFamilyDecl x Source #

Instances

Instances details
type XXFamilyDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCHsDataDefn x Source #

Instances

Instances details
type XCHsDataDefn (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXHsDataDefn x Source #

Instances

Instances details
type XXHsDataDefn (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCHsDerivingClause x Source #

Instances

Instances details
type XCHsDerivingClause (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXHsDerivingClause x Source #

Instances

Instances details
type XXHsDerivingClause (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDctSingle x Source #

Instances

Instances details
type XDctSingle (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDctMulti x Source #

Instances

Instances details
type XDctMulti (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXDerivClauseTys x Source #

Instances

Instances details
type XXDerivClauseTys (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XConDeclGADT x Source #

Instances

Instances details
type XConDeclGADT (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XConDeclH98 x Source #

Instances

Instances details
type XConDeclH98 (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXConDecl x Source #

Instances

Instances details
type XXConDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCFamEqn x r Source #

Instances

Instances details
type XCFamEqn (GhcPass _1) r # 
Instance details

Defined in GHC.Hs.Decls

type XCFamEqn (GhcPass _1) r = EpAnn [AddEpAnn]

type family XXFamEqn x r Source #

Instances

Instances details
type XXFamEqn (GhcPass _1) r # 
Instance details

Defined in GHC.Hs.Decls

type XXFamEqn (GhcPass _1) r = NoExtCon

type family XCTyFamInstDecl x Source #

Instances

Instances details
type XCTyFamInstDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXTyFamInstDecl x Source #

Instances

Instances details
type XXTyFamInstDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCClsInstDecl x Source #

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 XXClsInstDecl x Source #

Instances

Instances details
type XXClsInstDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XClsInstD x Source #

Instances

Instances details
type XClsInstD (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XDataFamInstD x Source #

Instances

Instances details
type XDataFamInstD GhcPs # 
Instance details

Defined in GHC.Hs.Decls

type XDataFamInstD GhcRn # 
Instance details

Defined in GHC.Hs.Decls

type XDataFamInstD GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XTyFamInstD x Source #

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 XXInstDecl x Source #

Instances

Instances details
type XXInstDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCDerivDecl x Source #

Instances

Instances details
type XCDerivDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXDerivDecl x Source #

Instances

Instances details
type XXDerivDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XStockStrategy x Source #

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 XAnyClassStrategy x Source #

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 XNewtypeStrategy x Source #

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 XViaStrategy x Source #

Instances

Instances details
type XViaStrategy GhcPs # 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcRn # 
Instance details

Defined in GHC.Hs.Decls

type XViaStrategy GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XCDefaultDecl x Source #

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 XXDefaultDecl x Source #

Instances

Instances details
type XXDefaultDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XForeignImport x Source #

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 XForeignExport x Source #

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 XXForeignDecl x Source #

Instances

Instances details
type XXForeignDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCRuleDecls x Source #

Instances

Instances details
type XCRuleDecls GhcPs # 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcRn # 
Instance details

Defined in GHC.Hs.Decls

type XCRuleDecls GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleDecls x Source #

Instances

Instances details
type XXRuleDecls (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XHsRule x Source #

Instances

Instances details
type XHsRule GhcPs # 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcRn # 
Instance details

Defined in GHC.Hs.Decls

type XHsRule GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleDecl x Source #

Instances

Instances details
type XXRuleDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCRuleBndr x Source #

Instances

Instances details
type XCRuleBndr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XRuleBndrSig x Source #

Instances

Instances details
type XRuleBndrSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXRuleBndr x Source #

Instances

Instances details
type XXRuleBndr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XWarnings x Source #

Instances

Instances details
type XWarnings GhcPs # 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcRn # 
Instance details

Defined in GHC.Hs.Decls

type XWarnings GhcTc # 
Instance details

Defined in GHC.Hs.Decls

type family XXWarnDecls x Source #

Instances

Instances details
type XXWarnDecls (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XWarning x Source #

Instances

Instances details
type XWarning (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXWarnDecl x Source #

Instances

Instances details
type XXWarnDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XHsAnnotation x Source #

Instances

Instances details
type XHsAnnotation (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXAnnDecl x Source #

Instances

Instances details
type XXAnnDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCRoleAnnotDecl x Source #

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 XXRoleAnnotDecl x Source #

Instances

Instances details
type XXRoleAnnotDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XCInjectivityAnn x Source #

Instances

Instances details
type XCInjectivityAnn (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XXInjectivityAnn x Source #

Instances

Instances details
type XXInjectivityAnn (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Decls

type family XVar x Source #

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 XUnboundVar x Source #

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 XConLikeOut x Source #

Instances

Instances details
type XConLikeOut (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XConLikeOut (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XRecFld x Source #

Instances

Instances details
type XRecFld (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XRecFld (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XOverLabel x Source #

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 XIPVar x Source #

Instances

Instances details
type XIPVar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XIPVar (GhcPass _1) = EpAnnCO

type family XOverLitE x Source #

Instances

Instances details
type XOverLitE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XLitE x Source #

Instances

Instances details
type XLitE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XLitE (GhcPass _1) = EpAnnCO

type family XLam x Source #

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 Source #

Instances

Instances details
type XLamCase (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XApp x Source #

Instances

Instances details
type XApp (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XApp (GhcPass _1) = EpAnnCO

type family XAppTypeE x Source #

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 XOpApp x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Expr

type family XNegApp x Source #

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 XPar x Source #

Instances

Instances details
type XPar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XSectionL x Source #

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 Source #

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 XExplicitTuple x Source #

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 XExplicitSum x Source #

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 XCase x Source #

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 XIf x Source #

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 XMultiIf x Source #

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 XLet x Source #

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 XDo x Source #

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 XExplicitList x Source #

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 XRecordCon x Source #

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 Source #

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 XGetField x Source #

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 XProjection x Source #

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 XExprWithTySig x Source #

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 XArithSeq x Source #

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 XBracket x Source #

Instances

Instances details
type XBracket (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XRnBracketOut x Source #

Instances

Instances details
type XRnBracketOut (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XTcBracketOut x Source #

Instances

Instances details
type XTcBracketOut (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XSpliceE x Source #

Instances

Instances details
type XSpliceE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XProc x Source #

Instances

Instances details
type XProc (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XProc (GhcPass _1) = EpAnn [AddEpAnn]

type family XStatic x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Expr

type family XTick x Source #

Instances

Instances details
type XTick (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XBinTick x Source #

Instances

Instances details
type XBinTick (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XPragE x Source #

Instances

Instances details
type XPragE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXExpr x Source #

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 XCHsFieldLabel x Source #

Instances

Instances details
type XCHsFieldLabel (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXHsFieldLabel x Source #

Instances

Instances details
type XXHsFieldLabel (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XSCC x Source #

Instances

Instances details
type XSCC (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXPragE x Source #

Instances

Instances details
type XXPragE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XUnambiguous x Source #

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 XAmbiguous x Source #

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 XXAmbiguousFieldOcc x Source #

Instances

Instances details
type XXAmbiguousFieldOcc (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XPresent x Source #

Instances

Instances details
type XPresent (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XMissing x Source #

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 XXTupArg x Source #

Instances

Instances details
type XXTupArg (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XTypedSplice x Source #

Instances

Instances details
type XTypedSplice (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XUntypedSplice x Source #

Instances

Instances details
type XUntypedSplice (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XQuasiQuote x Source #

Instances

Instances details
type XQuasiQuote (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XSpliced x Source #

Instances

Instances details
type XSpliced (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXSplice x Source #

Instances

Instances details
type XXSplice GhcPs # 
Instance details

Defined in GHC.Hs.Expr

type XXSplice GhcRn # 
Instance details

Defined in GHC.Hs.Expr

type XXSplice GhcTc # 
Instance details

Defined in GHC.Hs.Expr

type family XExpBr x Source #

Instances

Instances details
type XExpBr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XPatBr x Source #

Instances

Instances details
type XPatBr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XDecBrL x Source #

Instances

Instances details
type XDecBrL (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XDecBrG x Source #

Instances

Instances details
type XDecBrG (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XTypBr x Source #

Instances

Instances details
type XTypBr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XVarBr x Source #

Instances

Instances details
type XVarBr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XTExpBr x Source #

Instances

Instances details
type XTExpBr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXBracket x Source #

Instances

Instances details
type XXBracket (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XCmdTop x Source #

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 XXCmdTop x Source #

Instances

Instances details
type XXCmdTop (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XMG x b Source #

Instances

Instances details
type XMG GhcPs b # 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcRn b # 
Instance details

Defined in GHC.Hs.Expr

type XMG GhcTc b # 
Instance details

Defined in GHC.Hs.Expr

type family XXMatchGroup x b Source #

Instances

Instances details
type XXMatchGroup (GhcPass _1) b # 
Instance details

Defined in GHC.Hs.Expr

type family XCMatch x b Source #

Instances

Instances details
type XCMatch (GhcPass _1) b # 
Instance details

Defined in GHC.Hs.Expr

type XCMatch (GhcPass _1) b = EpAnn [AddEpAnn]

type family XXMatch x b Source #

Instances

Instances details
type XXMatch (GhcPass _1) b # 
Instance details

Defined in GHC.Hs.Expr

type XXMatch (GhcPass _1) b = NoExtCon

type family XCGRHSs x b Source #

Instances

Instances details
type XCGRHSs (GhcPass _1) _2 # 
Instance details

Defined in GHC.Hs.Expr

type XCGRHSs (GhcPass _1) _2 = NoExtField

type family XXGRHSs x b Source #

Instances

Instances details
type XXGRHSs (GhcPass _1) _2 # 
Instance details

Defined in GHC.Hs.Expr

type XXGRHSs (GhcPass _1) _2 = NoExtCon

type family XCGRHS x b Source #

Instances

Instances details
type XCGRHS (GhcPass _1) _2 # 
Instance details

Defined in GHC.Hs.Expr

type XCGRHS (GhcPass _1) _2 = EpAnn GrhsAnn

type family XXGRHS x b Source #

Instances

Instances details
type XXGRHS (GhcPass _1) b # 
Instance details

Defined in GHC.Hs.Expr

type XXGRHS (GhcPass _1) b = NoExtCon

type family XLastStmt x x' b Source #

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 XBindStmt x x' b Source #

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 XApplicativeStmt x x' b Source #

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 XBodyStmt x x' b Source #

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 XLetStmt x x' b Source #

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 XParStmt x x' b Source #

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 XTransStmt x x' b Source #

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 XRecStmt x x' b Source #

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 XXStmtLR x x' b Source #

Instances

Instances details
type XXStmtLR (GhcPass _1) (GhcPass _2) b # 
Instance details

Defined in GHC.Hs.Expr

type XXStmtLR (GhcPass _1) (GhcPass _2) b = NoExtCon

type family XCmdArrApp x Source #

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 Source #

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 XCmdApp x Source #

Instances

Instances details
type XCmdApp (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type XCmdApp (GhcPass _1) = EpAnnCO

type family XCmdLam x Source #

Instances

Instances details
type XCmdLam (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XCmdPar x Source #

Instances

Instances details
type XCmdPar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XCmdCase x Source #

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 XCmdLamCase x Source #

Instances

Instances details
type XCmdLamCase (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XCmdIf x Source #

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 XCmdLet x Source #

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 XCmdDo x Source #

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 XCmdWrap x Source #

Instances

Instances details
type XCmdWrap (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXCmd x Source #

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 XParStmtBlock x x' Source #

Instances

Instances details
type XParStmtBlock (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Expr

type family XXParStmtBlock x x' Source #

Instances

Instances details
type XXParStmtBlock (GhcPass pL) (GhcPass pR) # 
Instance details

Defined in GHC.Hs.Expr

type family XApplicativeArgOne x Source #

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 XApplicativeArgMany x Source #

Instances

Instances details
type XApplicativeArgMany (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XXApplicativeArg x Source #

Instances

Instances details
type XXApplicativeArg (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Expr

type family XHsChar x Source #

Instances

Instances details
type XHsChar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsCharPrim x Source #

Instances

Instances details
type XHsCharPrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsString x Source #

Instances

Instances details
type XHsString (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsStringPrim x Source #

Instances

Instances details
type XHsStringPrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsInt x Source #

Instances

Instances details
type XHsInt (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsIntPrim x Source #

Instances

Instances details
type XHsIntPrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsWordPrim x Source #

Instances

Instances details
type XHsWordPrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsInt64Prim x Source #

Instances

Instances details
type XHsInt64Prim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsWord64Prim x Source #

Instances

Instances details
type XHsWord64Prim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsInteger x Source #

Instances

Instances details
type XHsInteger (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsRat x Source #

Instances

Instances details
type XHsRat (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsFloatPrim x Source #

Instances

Instances details
type XHsFloatPrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XHsDoublePrim x Source #

Instances

Instances details
type XHsDoublePrim (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XXLit x Source #

Instances

Instances details
type XXLit (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type XXLit (GhcPass _1) = NoExtCon

type family XOverLit x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Lit

type family XXOverLit x Source #

Instances

Instances details
type XXOverLit (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Lit

type family XWildPat x Source #

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 XVarPat x Source #

Instances

Instances details
type XVarPat (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Pat

type family XLazyPat x Source #

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 XAsPat x Source #

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 XParPat x Source #

Instances

Instances details
type XParPat (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Pat

type family XBangPat x Source #

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 XListPat x Source #

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 XTuplePat x Source #

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 XSumPat x Source #

Instances

Instances details
type XSumPat GhcPs # 
Instance details

Defined in GHC.Hs.Pat

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 XConPat x Source #

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 family XViewPat x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Pat

type family XSplicePat x Source #

Instances

Instances details
type XSplicePat (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Pat

type family XLitPat x Source #

Instances

Instances details
type XLitPat (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Pat

type family XNPat x Source #

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 Source #

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 XSigPat x Source #

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 XCoPat x Source #

type family XXPat x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Pat

type family XHsRecField x Source #

Instances

Instances details
type XHsRecField _1 # 
Instance details

Defined in GHC.Hs.Pat

type family XHsQTvs x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Type

type family XXLHsQTyVars x Source #

Instances

Instances details
type XXLHsQTyVars (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XHsOuterImplicit x Source #

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 XHsOuterExplicit x flag Source #

Instances

Instances details
type XHsOuterExplicit GhcPs _1 # 
Instance details

Defined in GHC.Hs.Type

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 XXHsOuterTyVarBndrs x Source #

Instances

Instances details
type XXHsOuterTyVarBndrs (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XHsSig x Source #

Instances

Instances details
type XHsSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XXHsSigType x Source #

Instances

Instances details
type XXHsSigType (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XHsWC x b Source #

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 XXHsWildCardBndrs x b Source #

Instances

Instances details
type XXHsWildCardBndrs (GhcPass _1) _2 # 
Instance details

Defined in GHC.Hs.Type

type family XHsPS x Source #

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 GhcTc # 
Instance details

Defined in GHC.Hs.Type

type family XXHsPatSigType x Source #

Instances

Instances details
type XXHsPatSigType (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XForAllTy x Source #

Instances

Instances details
type XForAllTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XQualTy x Source #

Instances

Instances details
type XQualTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XTyVar x Source #

Instances

Instances details
type XTyVar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XAppTy x Source #

Instances

Instances details
type XAppTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XAppKindTy x Source #

Instances

Instances details
type XAppKindTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XFunTy x Source #

Instances

Instances details
type XFunTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XListTy x Source #

Instances

Instances details
type XListTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XTupleTy x Source #

Instances

Instances details
type XTupleTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XSumTy x Source #

Instances

Instances details
type XSumTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XOpTy x Source #

Instances

Instances details
type XOpTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XParTy x Source #

Instances

Instances details
type XParTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XIParamTy x Source #

Instances

Instances details
type XIParamTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XStarTy x Source #

Instances

Instances details
type XStarTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XKindSig x Source #

Instances

Instances details
type XKindSig (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XSpliceTy x Source #

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 XDocTy x Source #

Instances

Instances details
type XDocTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XBangTy x Source #

Instances

Instances details
type XBangTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XRecTy x Source #

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 XExplicitListTy x Source #

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 XExplicitTupleTy x Source #

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 XTyLit x Source #

Instances

Instances details
type XTyLit (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XWildCardTy x Source #

Instances

Instances details
type XWildCardTy (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XXType x Source #

Instances

Instances details
type XXType (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type XXType (GhcPass _1) = HsCoreTy

type family XHsForAllVis x Source #

Instances

Instances details
type XHsForAllVis (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XHsForAllInvis x Source #

Instances

Instances details
type XHsForAllInvis (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XXHsForAllTelescope x Source #

Instances

Instances details
type XXHsForAllTelescope (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XUserTyVar x Source #

Instances

Instances details
type XUserTyVar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XKindedTyVar x Source #

Instances

Instances details
type XKindedTyVar (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XXTyVarBndr x Source #

Instances

Instances details
type XXTyVarBndr (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XConDeclField x Source #

Instances

Instances details
type XConDeclField (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XXConDeclField x Source #

Instances

Instances details
type XXConDeclField (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XCFieldOcc x Source #

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 XXFieldOcc x Source #

Instances

Instances details
type XXFieldOcc (GhcPass _1) # 
Instance details

Defined in GHC.Hs.Type

type family XCImportDecl x Source #

Instances

Instances details
type XCImportDecl GhcPs # 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcRn # 
Instance details

Defined in GHC.Hs.ImpExp

type XCImportDecl GhcTc # 
Instance details

Defined in GHC.Hs.ImpExp

type family XXImportDecl x Source #

Instances

Instances details
type XXImportDecl (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEVar x Source #

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 XIEThingAbs x Source #

Instances

Instances details
type XIEThingAbs (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEThingAll x Source #

Instances

Instances details
type XIEThingAll (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEThingWith x Source #

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 'Typechecked) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEModuleContents x Source #

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 XIEGroup x Source #

Instances

Instances details
type XIEGroup (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEDoc x Source #

Instances

Instances details
type XIEDoc (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XIEDocNamed x Source #

Instances

Instances details
type XIEDocNamed (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type family XXIE x Source #

Instances

Instances details
type XXIE (GhcPass _1) # 
Instance details

Defined in GHC.Hs.ImpExp

type XXIE (GhcPass _1) = NoExtCon

type family NoGhcTc (p :: Type) Source #

See Note [NoGhcTc] in GHC.Hs.Extension. It has to be in this module because it is used like an extension point (in the data definitions of types that should be parameter-agnostic.

Instances

Instances details
type NoGhcTc (GhcPass pass) #

Marks that a field uses the GhcRn variant even when the pass parameter is GhcTc. Useful for storing HsTypes in GHC.Hs.Exprs, say, because HsType GhcTc should never occur. See Note [NoGhcTc]

Instance details

Defined in GHC.Hs.Extension

type NoGhcTc (GhcPass pass) = GhcPass (NoGhcTcPass pass)