| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
GHC.Rename.Names
Synopsis
- rnImports :: [LImportDecl GhcPs] -> RnM ([LImportDecl GhcRn], GlobalRdrEnv, ImportAvails, AnyHpcUsage)
- getLocalNonValBinders :: MiniFixityEnv -> HsGroup GhcPs -> RnM ((TcGblEnv, TcLclEnv), NameSet)
- newRecordSelector :: DuplicateRecordFields -> FieldSelectors -> [Name] -> LFieldOcc GhcPs -> RnM FieldLabel
- extendGlobalRdrEnvRn :: [AvailInfo] -> MiniFixityEnv -> RnM (TcGblEnv, TcLclEnv)
- gresFromAvails :: Maybe ImportSpec -> [AvailInfo] -> [GlobalRdrElt]
- calculateAvails :: HomeUnit -> ModIface -> IsSafeImport -> IsBootInterface -> ImportedBy -> ImportAvails
- reportUnusedNames :: TcGblEnv -> HscSource -> RnM ()
- checkConName :: RdrName -> TcRn ()
- mkChildEnv :: [GlobalRdrElt] -> NameEnv [GlobalRdrElt]
- findChildren :: NameEnv [a] -> Name -> [a]
- dodgyMsg :: (Outputable a, Outputable b) => SDoc -> a -> b -> SDoc
- dodgyMsgInsert :: forall p. IdP (GhcPass p) -> IE (GhcPass p)
- findImportUsage :: [LImportDecl GhcRn] -> [GlobalRdrElt] -> [ImportDeclUsage]
- getMinimalImports :: [ImportDeclUsage] -> RnM [LImportDecl GhcRn]
- printMinimalImports :: HscSource -> [ImportDeclUsage] -> RnM ()
- type ImportDeclUsage = (LImportDecl GhcRn, [GlobalRdrElt], [Name])
Documentation
rnImports :: [LImportDecl GhcPs] -> RnM ([LImportDecl GhcRn], GlobalRdrEnv, ImportAvails, AnyHpcUsage) Source #
Process Import Decls.  See rnImportDecl for a description of what
 the return types represent.
 Note: Do the non SOURCE ones first, so that we get a helpful warning
 for SOURCE ones that are unnecessary
getLocalNonValBinders :: MiniFixityEnv -> HsGroup GhcPs -> RnM ((TcGblEnv, TcLclEnv), NameSet) Source #
newRecordSelector :: DuplicateRecordFields -> FieldSelectors -> [Name] -> LFieldOcc GhcPs -> RnM FieldLabel Source #
extendGlobalRdrEnvRn :: [AvailInfo] -> MiniFixityEnv -> RnM (TcGblEnv, TcLclEnv) Source #
gresFromAvails :: Maybe ImportSpec -> [AvailInfo] -> [GlobalRdrElt] #
calculateAvails :: HomeUnit -> ModIface -> IsSafeImport -> IsBootInterface -> ImportedBy -> ImportAvails Source #
Calculate the ImportAvails induced by an import of a particular
 interface, but without imp_mods.
reportUnusedNames :: TcGblEnv -> HscSource -> RnM () Source #
checkConName :: RdrName -> TcRn () Source #
mkChildEnv :: [GlobalRdrElt] -> NameEnv [GlobalRdrElt] Source #
findChildren :: NameEnv [a] -> Name -> [a] Source #
dodgyMsgInsert :: forall p. IdP (GhcPass p) -> IE (GhcPass p) Source #
findImportUsage :: [LImportDecl GhcRn] -> [GlobalRdrElt] -> [ImportDeclUsage] Source #
getMinimalImports :: [ImportDeclUsage] -> RnM [LImportDecl GhcRn] Source #
printMinimalImports :: HscSource -> [ImportDeclUsage] -> RnM () Source #
type ImportDeclUsage = (LImportDecl GhcRn, [GlobalRdrElt], [Name]) Source #