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

Safe HaskellNone
LanguageHaskell2010

RnUtils

Synopsis

Documentation

checkDupRdrNames :: [Located RdrName] -> RnM () Source #

checkShadowedRdrNames :: [Located RdrName] -> RnM () Source #

checkDupNames :: [Name] -> RnM () Source #

checkDupAndShadowedNames :: (GlobalRdrEnv, LocalRdrEnv) -> [Name] -> RnM () Source #

dupNamesErr :: Outputable n => (n -> SrcSpan) -> NonEmpty n -> RnM () Source #

checkTupSize :: Int -> RnM () Source #

addFvRn :: FreeVars -> RnM (thing, FreeVars) -> RnM (thing, FreeVars) Source #

mapFvRn :: (a -> RnM (b, FreeVars)) -> [a] -> RnM ([b], FreeVars) Source #

mapMaybeFvRn :: (a -> RnM (b, FreeVars)) -> Maybe a -> RnM (Maybe b, FreeVars) Source #

warnUnusedMatches :: [Name] -> FreeVars -> RnM () Source #

warnUnusedTypePatterns :: [Name] -> FreeVars -> RnM () Source #

warnUnusedTopBinds :: [GlobalRdrElt] -> RnM () Source #

warnUnusedLocalBinds :: [Name] -> FreeVars -> RnM () Source #

checkUnusedRecordWildcard :: SrcSpan -> FreeVars -> Maybe [Name] -> RnM () Source #

Checks to see if we need to warn for -Wunused-record-wildcards or -Wredundant-record-wildcards

mkFieldEnv :: GlobalRdrEnv -> NameEnv (FieldLabelString, Name) Source #

Make a map from selector names to field labels and parent tycon names, to be used when reporting unused record fields.

unknownSubordinateErr :: SDoc -> RdrName -> SDoc Source #

badQualBndrErr :: RdrName -> SDoc Source #

typeAppErr :: String -> LHsType GhcPs -> SDoc Source #

data HsDocContext Source #

Constructors

pprHsDocContext :: HsDocContext -> SDoc Source #

inHsDocContext :: HsDocContext -> SDoc Source #

withHsDocContext :: HsDocContext -> SDoc -> SDoc Source #

newLocalBndrRn :: Located RdrName -> RnM Name Source #

newLocalBndrsRn :: [Located RdrName] -> RnM [Name] Source #

bindLocalNames :: [Name] -> RnM a -> RnM a Source #

bindLocalNamesFV :: [Name] -> RnM (a, FreeVars) -> RnM (a, FreeVars) Source #

addNameClashErrRn :: RdrName -> [GlobalRdrElt] -> RnM () Source #

extendTyVarEnvFVRn :: [Name] -> RnM (a, FreeVars) -> RnM (a, FreeVars) Source #

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