| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
Synopsis | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
Documentation | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
cvObtainTerm :: HscEnv -> Int -> Bool -> RttiType -> HValue -> IO Term | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
cvReconstructType :: HscEnv -> Int -> GhciType -> HValue -> IO (Maybe Type) | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
improveRTTIType :: HscEnv -> RttiType -> RttiType -> IO (Maybe TvSubst) | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
data Term | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isTerm :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isSuspension :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isPrim :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isFun :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isFunLike :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isNewtypeWrap :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isFullyEvaluated :: a -> IO Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isFullyEvaluatedTerm :: Term -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
termType :: Term -> RttiType | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
mapTermType :: (RttiType -> Type) -> Term -> Term | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
termTyVars :: Term -> TyVarSet | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
foldTerm :: TermFold a -> Term -> a | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
data TermFold a | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
foldTermM :: Monad m => TermFoldM m a -> Term -> m a | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
data TermFoldM m a | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
idTermFold :: TermFold Term | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
pprTerm :: TermPrinter -> TermPrinter | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
cPprTerm :: Monad m => CustomTermPrinter m -> Term -> m SDoc | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
Takes a list of custom printers with a explicit recursion knot and a term, and returns the output of the first succesful printer, or the default printer | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
cPprTermBase :: Monad m => CustomTermPrinter m | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
type CustomTermPrinter m = TermPrinterM m -> [Precedence -> Term -> m (Maybe SDoc)] | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
data Closure | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
getClosureData :: a -> IO Closure | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
data ClosureType | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
| ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isConstr :: ClosureType -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
isIndirection :: ClosureType -> Bool | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
sigmaType :: Type -> Type | ||||||||||||||||||||||||||||||||||||||||||||||||||||||
Produced by Haddock version 2.4.2 |