| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Language.PureScript.CST
Synopsis
- parseFromFile :: FilePath -> Text -> ([ParserWarning], Either (NonEmpty ParserError) Module)
- parseFromFiles :: forall m k. MonadError MultipleErrors m => (k -> FilePath) -> [(k, Text)] -> m [(k, ([ParserWarning], Module))]
- parseModuleFromFile :: FilePath -> Text -> Either (NonEmpty ParserError) (PartialResult Module)
- parseModulesFromFiles :: forall m k. MonadError MultipleErrors m => (k -> FilePath) -> [(k, Text)] -> m [(k, PartialResult Module)]
- unwrapParserError :: forall m a. MonadError MultipleErrors m => FilePath -> Either (NonEmpty ParserError) a -> m a
- toMultipleErrors :: FilePath -> NonEmpty ParserError -> MultipleErrors
- toMultipleWarnings :: FilePath -> [ParserWarning] -> MultipleErrors
- toPositionedError :: FilePath -> ParserError -> ErrorMessage
- toPositionedWarning :: FilePath -> ParserWarning -> ErrorMessage
- pureResult :: a -> PartialResult a
- module Language.PureScript.CST.Convert
- module Language.PureScript.CST.Errors
- module Language.PureScript.CST.Lexer
- type Parser = ParserM ParserError ParserState
- newtype ParserM e s a = Parser (forall r. s -> (s -> e -> r) -> (s -> a -> r) -> r)
- data ParserState = ParserState {- parserBuff :: [LexResult]
- parserErrors :: [ParserError]
- parserWarnings :: [ParserWarning]
 
- type LexResult = Either (LexState, ParserError) SourceToken
- runParser :: ParserState -> Parser a -> (ParserState, Either (NonEmpty ParserError) a)
- runTokenParser :: Parser a -> [LexResult] -> Either (NonEmpty ParserError) ([ParserWarning], a)
- module Language.PureScript.CST.Parser
- module Language.PureScript.CST.Print
- module Language.PureScript.CST.Types
Documentation
parseFromFile :: FilePath -> Text -> ([ParserWarning], Either (NonEmpty ParserError) Module) Source #
parseFromFiles :: forall m k. MonadError MultipleErrors m => (k -> FilePath) -> [(k, Text)] -> m [(k, ([ParserWarning], Module))] Source #
parseModuleFromFile :: FilePath -> Text -> Either (NonEmpty ParserError) (PartialResult Module) Source #
parseModulesFromFiles :: forall m k. MonadError MultipleErrors m => (k -> FilePath) -> [(k, Text)] -> m [(k, PartialResult Module)] Source #
unwrapParserError :: forall m a. MonadError MultipleErrors m => FilePath -> Either (NonEmpty ParserError) a -> m a Source #
toMultipleWarnings :: FilePath -> [ParserWarning] -> MultipleErrors Source #
toPositionedError :: FilePath -> ParserError -> ErrorMessage Source #
pureResult :: a -> PartialResult a Source #
type Parser = ParserM ParserError ParserState Source #
newtype ParserM e s a Source #
A bare bones, CPS'ed `StateT s (Except e) a`.
Constructors
| Parser (forall r. s -> (s -> e -> r) -> (s -> a -> r) -> r) | 
data ParserState Source #
Constructors
| ParserState | |
| Fields 
 | |
Instances
| Show ParserState Source # | |
| Defined in Language.PureScript.CST.Monad Methods showsPrec :: Int -> ParserState -> ShowS # show :: ParserState -> String # showList :: [ParserState] -> ShowS # | |
type LexResult = Either (LexState, ParserError) SourceToken Source #
runParser :: ParserState -> Parser a -> (ParserState, Either (NonEmpty ParserError) a) Source #
runTokenParser :: Parser a -> [LexResult] -> Either (NonEmpty ParserError) ([ParserWarning], a) Source #