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

Safe HaskellNone
LanguageHaskell2010

RnEnv

Synopsis

Documentation

newTopSrcBinder :: Located RdrName -> RnM Name Source #

lookupLocatedTopBndrRn :: Located RdrName -> RnM (Located Name) Source #

lookupTopBndrRn :: RdrName -> RnM Name Source #

lookupLocatedOccRn :: Located RdrName -> RnM (Located Name) Source #

lookupOccRn :: RdrName -> RnM Name Source #

lookupOccRn_maybe :: RdrName -> RnM (Maybe Name) Source #

lookupLocalOccRn_maybe :: RdrName -> RnM (Maybe Name) Source #

lookupInfoOccRn :: RdrName -> RnM [Name] Source #

lookupLocalOccThLvl_maybe :: Name -> RnM (Maybe (TopLevelFlag, ThLevel)) Source #

lookupLocalOccRn :: RdrName -> RnM Name Source #

lookupTypeOccRn :: RdrName -> RnM Name Source #

lookupGlobalOccRn :: RdrName -> RnM Name Source #

lookupGlobalOccRn_maybe :: RdrName -> RnM (Maybe Name) Source #

lookupOccRn_overloaded :: Bool -> RdrName -> RnM (Maybe (Either Name [Name])) Source #

lookupGlobalOccRn_overloaded :: Bool -> RdrName -> RnM (Maybe (Either Name [Name])) Source #

Like lookupOccRn_maybe , but with a more informative result if the RdrName happens to be a record selector:

  • Nothing -> name not in scope (no error reported)
  • Just (Left x) -> name uniquely refers to x, or there is a name clash (reported)
  • Just (Right xs) -> name refers to one or more record selectors; if overload_ok was False, this list will be a singleton.

lookupExactOcc :: Name -> RnM Name Source #

Lookup an Exact RdrName. See Note [Looking up Exact RdrNames]. This adds an error if the name cannot be found.

data ChildLookupResult Source #

Constructors

Instances
Instance details

Defined in RnEnv

lookupSubBndrOcc_helper :: Bool -> Bool -> Name -> RdrName -> RnM ChildLookupResult Source #

Used in export lists to lookup the children.

combineChildLookupResult :: [RnM ChildLookupResult] -> RnM ChildLookupResult Source #

Specialised version of msum for RnM ChildLookupResult

data HsSigCtxt Source #

Constructors

Instances
Instance details

Defined in RnEnv

lookupLocalTcNames :: HsSigCtxt -> SDoc -> RdrName -> RnM [(RdrName, Name)] Source #

lookupSigOccRn :: HsSigCtxt -> Sig GhcPs -> Located RdrName -> RnM (Located Name) Source #

lookupSigCtxtOccRn Source #

Arguments

-> SDoc

description of thing we're looking up, like "type family"

Lookup a name in relation to the names in a HsSigCtxt

lookupInstDeclBndr :: Name -> SDoc -> RdrName -> RnM Name Source #

lookupRecFieldOcc :: Maybe Name -> RdrName -> RnM Name Source #

Look up an occurrence of a field in record construction or pattern matching (but not update). When the -XDisambiguateRecordFields flag is on, take account of the data constructor name to disambiguate which field to use.

See Note [DisambiguateRecordFields].

lookupFamInstName :: Maybe Name -> Located RdrName -> RnM (Located Name) Source #

lookupConstructorFields :: Name -> RnM [FieldLabel] Source #

lookupGreAvailRn :: RdrName -> RnM (Name, AvailInfo) Source #

lookupSyntaxName :: Name -> RnM (SyntaxExpr GhcRn, FreeVars) Source #

lookupSyntaxName' Source #

Arguments

:: Name

The standard name

-> RnM Name

Possibly a non-standard name

lookupSyntaxNames :: [Name] -> RnM ([HsExpr GhcRn], FreeVars) Source #

lookupIfThenElse :: RnM (Maybe (SyntaxExpr GhcRn), FreeVars) Source #

addUsedGRE :: Bool -> GlobalRdrElt -> RnM () Source #

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

addUsedDataCons :: GlobalRdrEnv -> TyCon -> RnM () Source #

dataTcOccs :: RdrName -> [RdrName] Source #

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