Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
type SourceText = String Source
pragState :: DynFlags -> StringBuffer -> RealSrcLoc -> PState Source
mkPState :: DynFlags -> StringBuffer -> RealSrcLoc -> PState Source
PState | |
|
getDynFlags :: HasDynFlags m => m DynFlags Source
withThisPackage :: (PackageKey -> a) -> P a Source
failLocMsgP :: RealSrcLoc -> RealSrcLoc -> String -> P a Source
failSpanMsgP :: SrcSpan -> SDoc -> P a Source
srcParseFail :: P a Source
getMessages :: PState -> Messages Source
popContext :: P () Source
pushCurrentContext :: P () Source
setLastToken :: RealSrcSpan -> Int -> P () Source
setSrcLoc :: RealSrcLoc -> P () Source
activeContext :: P Bool Source
getLexState :: P Int Source
popLexState :: P Int Source
pushLexState :: Int -> P () Source
bangPatEnabled :: ExtsBitmap -> Bool Source
datatypeContextsEnabled :: ExtsBitmap -> Bool Source
traditionalRecordSyntaxEnabled :: ExtsBitmap -> Bool Source
explicitForallEnabled :: ExtsBitmap -> Bool Source
inRulePrag :: ExtsBitmap -> Bool Source
explicitNamespacesEnabled :: ExtsBitmap -> Bool Source
patternSynonymsEnabled :: ExtsBitmap -> Bool Source
sccProfilingOn :: ExtsBitmap -> Bool Source
hpcEnabled :: ExtsBitmap -> Bool Source
addWarning :: WarningFlag -> SrcSpan -> SDoc -> P () Source
lexTokenStream :: StringBuffer -> RealSrcLoc -> DynFlags -> ParseResult [Located Token] Source
addAnnotation :: SrcSpan -> AnnKeywordId -> SrcSpan -> P () Source