| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
SimpleParser.Explain
Documentation
class ExplainLabel l where Source #
Minimal complete definition
Instances
| ExplainLabel Void Source # | |
Defined in SimpleParser.Explain | |
| ExplainLabel TextLabel Source # | |
Defined in SimpleParser.Explain | |
| ExplainLabel SexpLabel Source # | |
Defined in SimpleParser.Examples.Sexp | |
| ExplainLabel l => ExplainLabel (CompoundTextLabel l) Source # | |
Defined in SimpleParser.Explain Methods explainLabel :: CompoundTextLabel l -> Builder Source # explainLabelText :: CompoundTextLabel l -> Text Source # | |
data ErrorExplanation Source #
Constructors
| ErrorExplanation | |
Instances
| Eq ErrorExplanation Source # | |
Defined in SimpleParser.Explain Methods (==) :: ErrorExplanation -> ErrorExplanation -> Bool # (/=) :: ErrorExplanation -> ErrorExplanation -> Bool # | |
| Show ErrorExplanation Source # | |
Defined in SimpleParser.Explain Methods showsPrec :: Int -> ErrorExplanation -> ShowS # show :: ErrorExplanation -> String # showList :: [ErrorExplanation] -> ShowS # | |
class ExplainError e where Source #
Methods
explainError :: e -> ErrorExplanation Source #
Instances
| ExplainError Void Source # | |
Defined in SimpleParser.Explain Methods explainError :: Void -> ErrorExplanation Source # | |
| (Token s ~ Char, TextualChunked (Chunk s)) => ExplainError (StreamError s) Source # | |
Defined in SimpleParser.Explain Methods explainError :: StreamError s -> ErrorExplanation Source # | |
| (Token s ~ Char, TextualChunked (Chunk s), ExplainError e) => ExplainError (CompoundError s e) Source # | |
Defined in SimpleParser.Explain Methods explainError :: CompoundError s e -> ErrorExplanation Source # | |
type Explainable l s e = (TextualStream s, PosStream s, ExplainLabel l, ExplainError e) Source #
data ParseErrorExplanation p Source #
Constructors
| ParseErrorExplanation | |
Fields
| |
Instances
| Eq p => Eq (ParseErrorExplanation p) Source # | |
Defined in SimpleParser.Explain Methods (==) :: ParseErrorExplanation p -> ParseErrorExplanation p -> Bool # (/=) :: ParseErrorExplanation p -> ParseErrorExplanation p -> Bool # | |
| Show p => Show (ParseErrorExplanation p) Source # | |
Defined in SimpleParser.Explain Methods showsPrec :: Int -> ParseErrorExplanation p -> ShowS # show :: ParseErrorExplanation p -> String # showList :: [ParseErrorExplanation p] -> ShowS # | |
explainParseError :: Explainable l s e => ParseError l s e -> ParseErrorExplanation (Pos s) Source #
buildParseErrorExplanation :: HasLinePos p => ParseErrorExplanation p -> Builder Source #
buildAllParseErrorExplanations :: (HasLinePos p, Foldable f) => f (ParseErrorExplanation p) -> Builder Source #