ghc-8.0.0.20160204: The GHC API

Safe HaskellNone
LanguageHaskell2010

RtClosureInspect

Synopsis

Documentation

cvObtainTerm :: HscEnv -> Int -> Bool -> RttiType -> HValue -> IO Term Source

cvReconstructType :: HscEnv -> Int -> GhciType -> HValue -> IO (Maybe Type) Source

improveRTTIType :: HscEnv -> RttiType -> RttiType -> Maybe TCvSubst Source

data Term Source

Constructors

Term 

Fields

Prim 

Fields

Suspension 

Fields

NewtypeWrap 

Fields

RefWrap 

Fields

Instances

termType :: Term -> RttiType Source

mapTermType :: (RttiType -> Type) -> Term -> Term Source

data TermFold a Source

Constructors

TermFold 

Fields

foldTermM :: Monad m => TermFoldM m a -> Term -> m a Source

data TermFoldM m a Source

Constructors

TermFoldM 

Fields

pprTerm :: TermPrinter -> TermPrinter Source

cPprTerm :: Monad m => CustomTermPrinter m -> Term -> m SDoc Source

Takes a list of custom printers with a explicit recursion knot and a term, and returns the output of the first successful printer, or the default printer

type CustomTermPrinter m = TermPrinterM m -> [Precedence -> Term -> m (Maybe SDoc)] Source