Safe Haskell | None |
---|---|
Language | Haskell2010 |
All the CPP for GHC version compability should live in this module.
Synopsis
- type WarnFlags = EnumSet WarningFlag
- emptyWarnFlags :: WarnFlags
- makeUserStyle :: DynFlags -> PrintUnqualified -> PprStyle
- getModuleName :: (a, b) -> a
- getTyThing :: (a, b, c, d, e) -> a
- fixInfo :: (a, b, c, d, e) -> (a, b, c, d)
- getModSummaries :: ModuleGraph -> [ModSummary]
- mapOverIncludePaths :: (FilePath -> FilePath) -> DynFlags -> DynFlags
- type LExpression = LHsExpr GhcTc
- type LBinding = LHsBind GhcTc
- type LPattern = LPat GhcTc
- inTypes :: MatchGroup GhcTc LExpression -> [Type]
- outType :: MatchGroup GhcTc LExpression -> Type
- mapMG :: (ModSummary -> ModSummary) -> ModuleGraph -> ModuleGraph
- mgModSummaries :: ModuleGraph -> [ModSummary]
- numLoadedPlugins :: DynFlags -> Int
- initializePlugins :: HscEnv -> DynFlags -> IO DynFlags
- unsetLogAction :: GhcMonad m => m ()
Documentation
type WarnFlags = EnumSet WarningFlag Source #
makeUserStyle :: DynFlags -> PrintUnqualified -> PprStyle Source #
getModuleName :: (a, b) -> a Source #
getTyThing :: (a, b, c, d, e) -> a Source #
getModSummaries :: ModuleGraph -> [ModSummary] Source #
type LExpression = LHsExpr GhcTc Source #
inTypes :: MatchGroup GhcTc LExpression -> [Type] Source #
outType :: MatchGroup GhcTc LExpression -> Type Source #
mapMG :: (ModSummary -> ModSummary) -> ModuleGraph -> ModuleGraph #
Map a function f
over all the ModSummaries
.
To preserve invariants f
can't change the isBoot status.
mgModSummaries :: ModuleGraph -> [ModSummary] #
numLoadedPlugins :: DynFlags -> Int Source #
unsetLogAction :: GhcMonad m => m () Source #