Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
type GmLogAction = LogAction Source
setLogAction :: DynFlags -> GmLogAction -> DynFlags Source
getSrcFile :: SrcSpan -> Maybe String Source
withInteractiveContext :: GhcMonad m => m a -> m a Source
toStringBuffer :: GhcMonad m => [String] -> m StringBuffer Source
setCabalPkg :: DynFlags -> DynFlags Source
setDumpSplices :: DynFlags -> DynFlags Source
isDumpSplices :: DynFlags -> Bool Source
filterOutChildren :: (a -> TyThing) -> [a] -> [a] Source
errorMsgSpan :: ErrMsg -> SrcSpan Source
typeForUser :: Type -> SDoc Source
nameForUser :: Name -> SDoc Source
occNameForUser :: OccName -> SDoc Source
fromTyThing :: TyThing -> GapThing Source
fileModSummary :: GhcMonad m => FilePath -> m ModSummary Source
occName :: HasOccName name => name -> OccName
listVisibleModuleNames :: DynFlags -> [ModuleName]
listVisibleModules :: DynFlags -> [Module] Source
isSynTyCon :: TyCon -> Bool Source
:: String | Haskell module source text (full Unicode is supported) |
-> DynFlags | |
-> FilePath | the filename (for source locations) |
-> Either ErrorMessages (WarningMessages, Located (HsModule RdrName)) |
mkErrStyle' :: DynFlags -> PrintUnqualified -> PprStyle Source