Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
type IfLclName = FastString Source
type IfacePredType = IfaceType Source
data IfaceCoercion Source
data IfaceTyLit Source
data IfaceTcArgs Source
type IfaceContext = [IfacePredType] Source
type IfaceLamBndr = (IfaceBndr, IfaceOneShot) Source
type IfaceTvBndr = (IfLclName, IfaceKind) Source
type IfaceIdBndr = (IfLclName, IfaceType) Source
toIfaceType :: Type -> IfaceType Source
toIfaceTypes :: [Type] -> [IfaceType] Source
toIfaceKind :: Type -> IfaceType Source
toIfaceTyVar :: TyVar -> FastString Source
toIfaceBndr :: Var -> IfaceBndr Source
toIfaceIdBndr :: Id -> (IfLclName, IfaceType) Source
toIfaceTvBndrs :: [TyVar] -> [(IfLclName, IfaceType)] Source
toIfaceTyCon :: TyCon -> IfaceTyCon Source
toIfaceTcArgs :: TyCon -> [Type] -> IfaceTcArgs Source
tcArgsIfaceTypes :: IfaceTcArgs -> [IfaceType] Source
pprIfaceType :: IfaceType -> SDoc Source
pprIfaceContext :: Outputable a => [a] -> SDoc Source
pprIfaceContextArr :: Outputable a => [a] -> SDoc Source
pprIfaceContextMaybe :: Outputable a => [a] -> Maybe SDoc Source
pprIfaceIdBndr :: (IfLclName, IfaceType) -> SDoc Source
pprIfaceTvBndr :: IfaceTvBndr -> SDoc Source
pprIfaceTvBndrs :: [IfaceTvBndr] -> SDoc Source
pprIfaceBndrs :: [IfaceBndr] -> SDoc Source
pprIfaceTcArgs :: IfaceTcArgs -> SDoc Source
pprIfaceForAllPart :: Outputable a => [IfaceTvBndr] -> [a] -> SDoc -> SDoc Source
pprIfaceForAll :: [IfaceTvBndr] -> SDoc Source
pprIfaceSigmaType :: IfaceType -> SDoc Source
splitIfaceSigmaTy :: IfaceType -> ([IfaceTvBndr], [IfacePredType], IfaceType) Source
pprIfaceTypeApp :: IfaceTyCon -> IfaceTcArgs -> SDoc Source
pprUserIfaceForAll :: [IfaceTvBndr] -> SDoc Source
suppressIfaceKinds :: DynFlags -> [IfaceTvBndr] -> [a] -> [a] Source
stripIfaceKindVars :: DynFlags -> [IfaceTvBndr] -> [IfaceTvBndr] Source
stripKindArgs :: DynFlags -> IfaceTcArgs -> IfaceTcArgs Source
substIfaceType :: IfaceTySubst -> IfaceType -> IfaceType Source
substIfaceTyVar :: IfaceTySubst -> IfLclName -> IfaceType Source
substIfaceTcArgs :: IfaceTySubst -> IfaceTcArgs -> IfaceTcArgs Source
mkIfaceTySubst :: [IfaceTvBndr] -> [IfaceType] -> IfaceTySubst Source