Safe Haskell | None |
---|---|
Language | Haskell98 |
- getModels :: GhcInfo -> Config -> FixResult Error -> IO (FixResult Error)
- getModel :: GhcInfo -> Config -> Error -> Ghc Error
- getModel' :: GhcInfo -> Config -> Error -> Ghc Error
- withContext :: Config -> SMTSolver -> FilePath -> (Context -> IO a) -> IO a
- toFixCfg :: Config -> Config
- dictProxy :: forall t. Dict (Targetable t) -> Proxy t
- asTypeOfDict :: forall t. t -> Dict (Targetable t) -> t
- data Dict :: Constraint -> * where
- data TargetDict = TargetDict (Dict (Targetable t))
- addDicts :: [PredType] -> [(Symbol, SpecType)] -> Ghc [(Symbol, SpecType, Maybe TargetDict)]
- addDict :: [PredType] -> (Symbol, SpecType) -> Ghc (Symbol, SpecType, Maybe TargetDict)
- addDict' :: [PredType] -> (Symbol, SpecType) -> Ghc (Symbol, SpecType, Maybe TargetDict)
- type Su = [(TyVar, Type)]
- monomorphize :: [PredType] -> Type -> Ghc (Maybe Su)
- monomorphizeOne :: [PredType] -> TyVar -> Maybe Su -> Ghc (Maybe Su)
- monomorphizeFree :: TyVar -> Su -> Maybe Su
- hscParsedStmt :: HscEnv -> GhciLStmt RdrName -> IO (Maybe ([Id], IO [HValue], FixityEnv))
- handleWarnings :: Hsc ()
- ioMsgMaybe :: IO (Messages, Maybe a) -> Hsc a
- throwErrors :: ErrorMessages -> Hsc a
- getWarnings :: Hsc WarningMessages
- clearWarnings :: Hsc ()
- logWarnings :: WarningMessages -> Hsc ()
- hscParsedDecls :: HscEnv -> [LHsDecl RdrName] -> IO ([TyThing], InteractiveContext)
Documentation
asTypeOfDict :: forall t. t -> Dict (Targetable t) -> t Source #
data TargetDict Source #
TargetDict (Dict (Targetable t)) |
addDicts :: [PredType] -> [(Symbol, SpecType)] -> Ghc [(Symbol, SpecType, Maybe TargetDict)] Source #
monomorphize :: [PredType] -> Type -> Ghc (Maybe Su) Source #
Attempt to monomorphize a Type
according to simple defaulting rules.
handleWarnings :: Hsc () Source #
throwErrors :: ErrorMessages -> Hsc a Source #
clearWarnings :: Hsc () Source #
logWarnings :: WarningMessages -> Hsc () Source #
hscParsedDecls :: HscEnv -> [LHsDecl RdrName] -> IO ([TyThing], InteractiveContext) Source #