ghc-6.10.2: The GHC APIContentsIndex
Linker
Synopsis
data HValue
getHValue :: HscEnv -> Name -> IO HValue
showLinkerState :: IO ()
linkExpr :: HscEnv -> SrcSpan -> UnlinkedBCO -> IO HValue
unload :: DynFlags -> [Linkable] -> IO ()
withExtendedLinkEnv :: (MonadIO m, ExceptionMonad m) => [(Name, HValue)] -> m a -> m a
extendLinkEnv :: [(Name, HValue)] -> IO ()
deleteFromLinkEnv :: [Name] -> IO ()
extendLoadedPkgs :: [PackageId] -> IO ()
linkPackages :: DynFlags -> [PackageId] -> IO ()
initDynLinker :: DynFlags -> IO ()
dataConInfoPtrToName :: Ptr () -> TcM (Either String Name)
Documentation
data HValue
getHValue :: HscEnv -> Name -> IO HValue
showLinkerState :: IO ()
linkExpr :: HscEnv -> SrcSpan -> UnlinkedBCO -> IO HValue
unload :: DynFlags -> [Linkable] -> IO ()
withExtendedLinkEnv :: (MonadIO m, ExceptionMonad m) => [(Name, HValue)] -> m a -> m a
Temporarily extend the linker state.
extendLinkEnv :: [(Name, HValue)] -> IO ()
deleteFromLinkEnv :: [Name] -> IO ()
extendLoadedPkgs :: [PackageId] -> IO ()
linkPackages :: DynFlags -> [PackageId] -> IO ()
initDynLinker :: DynFlags -> IO ()
dataConInfoPtrToName :: Ptr () -> TcM (Either String Name)

Given a data constructor in the heap, find its Name. The info tables for data constructors have a field which records the source name of the constructor as a Ptr Word8 (UTF-8 encoded string). The format is:

Package:Module.Name

We use this string to lookup the interpreter's internal representation of the name using the lookupOrig.

Produced by Haddock version 2.4.2