ghc-mod-5.6.0.0: Happy Haskell Programming

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.GhcMod.Gap

Synopsis

Documentation

setNoMaxRelevantBindings :: DynFlags -> DynFlags Source #

Set DynFlags equivalent to "-fno-max-relevant-bindings".

filterOutChildren :: (a -> TyThing) -> [a] -> [a] Source #

class HasType a where Source #

Minimal complete definition

getType

Methods

getType :: GhcMonad m => TypecheckedModule -> a -> m (Maybe (SrcSpan, Type)) Source #

occName :: HasOccName name => name -> OccName #

parseModuleHeader Source #

Arguments

:: String

Haskell module source text (full Unicode is supported)

-> DynFlags 
-> FilePath

the filename (for source locations)

-> Either ErrorMessages (WarningMessages, Located (HsModule RdrName)) 

everythingStagedWithContext :: Stage -> s -> (r -> r -> r) -> r -> GenericQ (s -> (r, s)) -> GenericQ r Source #

Like everything, but avoid known potholes, based on the Stage that generated the Ast.