ghc-lib-0.1.0: The GHC API, decoupled from GHC versions

Safe HaskellNone
LanguageHaskell2010

RnNames

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 :: Bool -> [Name] -> LFieldOcc GhcPs -> RnM FieldLabel Source #

extendGlobalRdrEnvRn :: [AvailInfo] -> MiniFixityEnv -> RnM (TcGblEnv, TcLclEnv) Source #

gresFromAvails :: Maybe ImportSpec -> [AvailInfo] -> [GlobalRdrElt] #

make a GlobalRdrEnv where all the elements point to the same Provenance (useful for "hiding" imports, or imports with no details).

calculateAvails :: DynFlags -> ModIface -> IsSafeImport -> IsBootInterface -> ImportedBy -> ImportAvails Source #

Calculate the ImportAvails induced by an import of a particular interface, but without imp_mods .

reportUnusedNames :: Maybe (Located [LIE GhcPs]) -> TcGblEnv -> RnM () Source #

checkConName :: RdrName -> TcRn () Source #

mkChildEnv :: [GlobalRdrElt] -> NameEnv [GlobalRdrElt] Source #

findChildren :: NameEnv [a] -> Name -> [a] Source #

dodgyMsg :: (Outputable a, Outputable b) => SDoc -> a -> b -> SDoc Source #

dodgyMsgInsert :: forall p. IdP (GhcPass p) -> IE (GhcPass p) Source #

findImportUsage :: [LImportDecl GhcRn] -> [GlobalRdrElt] -> [ImportDeclUsage] Source #

getMinimalImports :: [ImportDeclUsage] -> RnM [LImportDecl GhcRn] Source #

printMinimalImports :: [ImportDeclUsage] -> RnM () Source #

type ImportDeclUsage = (LImportDecl GhcRn, [GlobalRdrElt], [Name]) Source #

AltStyle によって変換されたページ (->オリジナル) /