Safe Haskell | None |
---|---|
Language | Haskell2010 |
Functions for converting Core things to interface file things.
Synopsis
- toIfaceTvBndr :: TyVar -> IfaceTvBndr
- toIfaceTvBndrs :: [TyVar] -> [IfaceTvBndr]
- toIfaceIdBndr :: Id -> IfaceIdBndr
- toIfaceBndr :: Var -> IfaceBndr
- toIfaceForAllBndr :: VarBndr TyCoVar flag -> VarBndr IfaceBndr flag
- toIfaceTyCoVarBinders :: [VarBndr Var vis] -> [VarBndr IfaceBndr vis]
- toIfaceTyVar :: TyVar -> FastString
- toIfaceType :: Type -> IfaceType
- toIfaceTypeX :: VarSet -> Type -> IfaceType
- toIfaceKind :: Type -> IfaceType
- toIfaceTcArgs :: TyCon -> [Type] -> IfaceAppArgs
- toIfaceTyCon :: TyCon -> IfaceTyCon
- toIfaceTyCon_name :: Name -> IfaceTyCon
- toIfaceTyLit :: TyLit -> IfaceTyLit
- tidyToIfaceType :: TidyEnv -> Type -> IfaceType
- tidyToIfaceContext :: TidyEnv -> ThetaType -> IfaceContext
- tidyToIfaceTcArgs :: TidyEnv -> TyCon -> [Type] -> IfaceAppArgs
- toIfaceCoercion :: Coercion -> IfaceCoercion
- toIfaceCoercionX :: VarSet -> Coercion -> IfaceCoercion
- patSynToIfaceDecl :: PatSyn -> IfaceDecl
- toIfaceExpr :: CoreExpr -> IfaceExpr
- toIfaceBang :: TidyEnv -> HsImplBang -> IfaceBang
- toIfaceSrcBang :: HsSrcBang -> IfaceSrcBang
- toIfaceLetBndr :: Id -> IfaceLetBndr
- toIfaceIdDetails :: IdDetails -> IfaceIdDetails
- toIfaceIdInfo :: IdInfo -> IfaceIdInfo
- toIfUnfolding :: Bool -> Unfolding -> Maybe IfaceInfoItem
- toIfaceTickish :: Tickish Id -> Maybe IfaceTickish
- toIfaceBind :: Bind Id -> IfaceBinding
- toIfaceAlt :: (AltCon, [Var], CoreExpr) -> (IfaceConAlt, [FastString], IfaceExpr)
- toIfaceCon :: AltCon -> IfaceConAlt
- toIfaceApp :: Expr CoreBndr -> [Arg CoreBndr] -> IfaceExpr
- toIfaceVar :: Id -> IfaceExpr
- toIfaceLFInfo :: Name -> LambdaFormInfo -> IfaceLFInfo
Binders
toIfaceTvBndr :: TyVar -> IfaceTvBndr Source #
toIfaceTvBndrs :: [TyVar] -> [IfaceTvBndr] Source #
toIfaceIdBndr :: Id -> IfaceIdBndr Source #
toIfaceBndr :: Var -> IfaceBndr Source #
toIfaceTyVar :: TyVar -> FastString Source #
Types
toIfaceType :: Type -> IfaceType Source #
toIfaceKind :: Type -> IfaceType Source #
toIfaceTcArgs :: TyCon -> [Type] -> IfaceAppArgs Source #
toIfaceTyCon :: TyCon -> IfaceTyCon Source #
toIfaceTyCon_name :: Name -> IfaceTyCon Source #
toIfaceTyLit :: TyLit -> IfaceTyLit Source #
Tidying types
tidyToIfaceContext :: TidyEnv -> ThetaType -> IfaceContext Source #
tidyToIfaceTcArgs :: TidyEnv -> TyCon -> [Type] -> IfaceAppArgs Source #
Coercions
toIfaceCoercionX :: VarSet -> Coercion -> IfaceCoercion Source #
Pattern synonyms
patSynToIfaceDecl :: PatSyn -> IfaceDecl Source #
Expressions
toIfaceExpr :: CoreExpr -> IfaceExpr Source #
toIfaceBang :: TidyEnv -> HsImplBang -> IfaceBang Source #
toIfaceLetBndr :: Id -> IfaceLetBndr Source #
toIfaceIdInfo :: IdInfo -> IfaceIdInfo Source #
toIfUnfolding :: Bool -> Unfolding -> Maybe IfaceInfoItem Source #
toIfaceTickish :: Tickish Id -> Maybe IfaceTickish Source #
toIfaceBind :: Bind Id -> IfaceBinding Source #
toIfaceAlt :: (AltCon, [Var], CoreExpr) -> (IfaceConAlt, [FastString], IfaceExpr) Source #
toIfaceCon :: AltCon -> IfaceConAlt Source #
toIfaceVar :: Id -> IfaceExpr Source #
Other stuff
toIfaceLFInfo :: Name -> LambdaFormInfo -> IfaceLFInfo Source #