Safe Haskell | None |
---|---|
Language | Haskell2010 |
Parsers for use with ByteStream
s.
Documentation
Instances
MonadTrans (Parser r) Source # | |
Defined in Bio.Streaming.Parse | |
Monad (Parser r m) Source # | |
Functor (Parser r m) Source # | |
Applicative (Parser r m) Source # | |
Defined in Bio.Streaming.Parse | |
MonadIO m => MonadIO (Parser r m) Source # | |
Defined in Bio.Streaming.Parse | |
MonadThrow (Parser r m) Source # | |
Defined in Bio.Streaming.Parse |
data ParseError Source #
ParseError | |
|
Instances
Show ParseError Source # | |
Defined in Bio.Streaming.Parse showsPrec :: Int -> ParseError -> ShowS # show :: ParseError -> String # showList :: [ParseError] -> ShowS # | |
Exception ParseError Source # | |
Defined in Bio.Streaming.Parse toException :: ParseError -> SomeException # fromException :: SomeException -> Maybe ParseError # displayException :: ParseError -> String # |
data EofException Source #
Instances
Show EofException Source # | |
Defined in Bio.Streaming.Parse showsPrec :: Int -> EofException -> ShowS # show :: EofException -> String # showList :: [EofException] -> ShowS # | |
Exception EofException Source # | |
Defined in Bio.Streaming.Parse |
parse :: Monad m => (Int64 -> Parser r m a) -> ByteStream m r -> m (Either (SomeException, ByteStream m r) (Either r (a, ByteStream m r))) Source #
parseIO :: MonadIO m => (Int64 -> Parser r m a) -> ByteStream m r -> m (Either r (a, ByteStream m r)) Source #
parseLog :: MonadLog m => Level -> (Int64 -> Parser r m a) -> ByteStream m r -> m (Either r (a, ByteStream m r)) Source #
parseM :: MonadThrow m => (Int64 -> Parser r m a) -> ByteStream m r -> m (Either r (a, ByteStream m r)) Source #
abortParse :: Monad m => Parser r m a Source #