Safe Haskell | None |
---|---|
Language | Haskell2010 |
Kempe.Parser
Documentation
parseWithMax :: ByteString -> Either (ParseError AlexPosn) (Int, Module AlexPosn AlexPosn AlexPosn) Source #
parseWithCtx :: ByteString -> AlexUserState -> Either (ParseError AlexPosn) (AlexUserState, Module AlexPosn AlexPosn AlexPosn) Source #
parseWithInitCtx :: ByteString -> Either (ParseError AlexPosn) (AlexUserState, Module AlexPosn AlexPosn AlexPosn) Source #
data ParseError a Source #
Constructors
Unexpected (Token a) | |
LexErr String | |
NoImpl (Name a) |
Instances
Pretty a => Show (ParseError a) Source # | |
Defined in Kempe.Parser Methods showsPrec :: Int -> ParseError a -> ShowS # show :: ParseError a -> String # showList :: [ParseError a] -> ShowS # | |
Generic (ParseError a) Source # | |
Defined in Kempe.Parser Associated Types type Rep (ParseError a) :: Type -> Type # | |
(Pretty a, Typeable a) => Exception (ParseError a) Source # | |
Defined in Kempe.Parser Methods toException :: ParseError a -> SomeException # fromException :: SomeException -> Maybe (ParseError a) # displayException :: ParseError a -> String # | |
NFData a => NFData (ParseError a) Source # | |
Defined in Kempe.Parser Methods rnf :: ParseError a -> () # | |
Pretty a => Pretty (ParseError a) Source # | |
Defined in Kempe.Parser | |
type Rep (ParseError a) Source # | |
Defined in Kempe.Parser |