Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data HsExprArg (p :: TcPass)
- data EValArg (p :: TcPass) where
- data TcPass
- type Rebuilder = HsExpr GhcTc -> [HsExprArg 'TcpTc] -> HsExpr GhcTc
- splitHsApps :: HsExpr GhcRn -> (HsExpr GhcRn, [HsExprArg 'TcpRn], Rebuilder)
- addArgWrap :: HsWrapper -> [HsExprArg 'TcpInst] -> [HsExprArg 'TcpInst]
- eValArgExpr :: EValArg 'TcpInst -> LHsExpr GhcRn
- isHsValArg :: HsExprArg id -> Bool
- setSrcSpanFromArgs :: [HsExprArg 'TcpRn] -> TcM a -> TcM a
- countLeadingValArgs :: [HsExprArg id] -> Int
- isVisibleArg :: HsExprArg id -> Bool
- pprHsExprArgTc :: HsExprArg 'TcpInst -> SDoc
- rebuildPrefixApps :: Rebuilder
- tcInferAppHead :: HsExpr GhcRn -> [HsExprArg 'TcpRn] -> Maybe TcRhoType -> TcM (HsExpr GhcTc, TcSigmaType)
- tcInferAppHead_maybe :: HsExpr GhcRn -> [HsExprArg 'TcpRn] -> Maybe TcRhoType -> TcM (Maybe (HsExpr GhcTc, TcSigmaType))
- tcInferId :: Name -> TcM (HsExpr GhcTc, TcSigmaType)
- tcCheckId :: Name -> ExpRhoType -> TcM (HsExpr GhcTc)
- obviousSig :: HsExpr GhcRn -> Maybe (LHsSigWcType GhcRn)
- addAmbiguousNameErr :: RdrName -> TcM ()
- tyConOf :: FamInstEnvs -> TcSigmaType -> Maybe TyCon
- tyConOfET :: FamInstEnvs -> ExpRhoType -> Maybe TyCon
- lookupParents :: RdrName -> RnM [(RecSelParent, GlobalRdrElt)]
- fieldNotInType :: RecSelParent -> RdrName -> SDoc
- notSelector :: Name -> SDoc
- nonBidirectionalErr :: Outputable name => name -> TcM a
- addExprCtxt :: HsExpr GhcRn -> TcRn a -> TcRn a
- addLExprCtxt :: LHsExpr GhcRn -> TcRn a -> TcRn a
- addFunResCtxt :: HsExpr GhcTc -> [HsExprArg 'TcpTc] -> TcType -> ExpRhoType -> TcM a -> TcM a
Documentation
eValArgExpr :: EValArg 'TcpInst -> LHsExpr GhcRn Source #
isHsValArg :: HsExprArg id -> Bool Source #
setSrcSpanFromArgs :: [HsExprArg 'TcpRn] -> TcM a -> TcM a Source #
countLeadingValArgs :: [HsExprArg id] -> Int Source #
isVisibleArg :: HsExprArg id -> Bool Source #
pprHsExprArgTc :: HsExprArg 'TcpInst -> SDoc Source #
tcInferAppHead :: HsExpr GhcRn -> [HsExprArg 'TcpRn] -> Maybe TcRhoType -> TcM (HsExpr GhcTc, TcSigmaType) Source #
tcInferAppHead_maybe :: HsExpr GhcRn -> [HsExprArg 'TcpRn] -> Maybe TcRhoType -> TcM (Maybe (HsExpr GhcTc, TcSigmaType)) Source #
tcCheckId :: Name -> ExpRhoType -> TcM (HsExpr GhcTc) Source #
obviousSig :: HsExpr GhcRn -> Maybe (LHsSigWcType GhcRn) Source #
addAmbiguousNameErr :: RdrName -> TcM () Source #
This name really is ambiguous, so add a suitable "ambiguous occurrence" error, then continue
tyConOfET :: FamInstEnvs -> ExpRhoType -> Maybe TyCon Source #
lookupParents :: RdrName -> RnM [(RecSelParent, GlobalRdrElt)] Source #
fieldNotInType :: RecSelParent -> RdrName -> SDoc Source #
notSelector :: Name -> SDoc Source #
nonBidirectionalErr :: Outputable name => name -> TcM a Source #
addExprCtxt :: HsExpr GhcRn -> TcRn a -> TcRn a Source #
addLExprCtxt :: LHsExpr GhcRn -> TcRn a -> TcRn a Source #
addFunResCtxt :: HsExpr GhcTc -> [HsExprArg 'TcpTc] -> TcType -> ExpRhoType -> TcM a -> TcM a Source #