conduit-combinators-1.0.3: Commonly used conduit functions, for both chunked and unchunked data

Safe HaskellNone
LanguageHaskell98

Data.Conduit.Combinators.Stream

Description

These are stream fusion versions of some of the functions in Data.Conduit.Combinators. Many functions don't have stream versions here because instead they have RULES which inline a definition that fuses.

Synopsis

Documentation

yieldManyS :: (Monad m, MonoFoldable mono) => mono -> StreamProducer m (Element mono) Source

repeatMS :: Monad m => m a -> StreamProducer m a Source

repeatWhileMS :: Monad m => m a -> (a -> Bool) -> StreamProducer m a Source

foldl1S :: Monad m => (a -> a -> a) -> StreamConsumer a m (Maybe a) Source

allS :: Monad m => (a -> Bool) -> StreamConsumer a m Bool Source

anyS :: Monad m => (a -> Bool) -> StreamConsumer a m Bool Source

sinkLazyS :: (Monad m, LazySequence lazy strict) => StreamConsumer strict m lazy Source

sinkVectorS :: (MonadBase base m, Vector v a, PrimMonad base) => StreamConsumer a m (v a) Source

sinkVectorNS Source

Arguments

:: (MonadBase base m, Vector v a, PrimMonad base) 
=> Int

maximum allowed size

-> StreamConsumer a m (v a) 

sinkLazyBuilderS :: (Monad m, Monoid builder, ToBuilder a builder, Builder builder lazy) => StreamConsumer a m lazy Source

findS :: Monad m => (a -> Bool) -> StreamConsumer a m (Maybe a) Source

concatMapS :: (Monad m, MonoFoldable mono) => (a -> mono) -> StreamConduit a m (Element mono) Source

concatMapMS :: (Monad m, MonoFoldable mono) => (a -> m mono) -> StreamConduit a m (Element mono) Source

concatS :: (Monad m, MonoFoldable mono) => StreamConduit mono m (Element mono) Source

scanlS :: Monad m => (a -> b -> a) -> a -> StreamConduit b m a Source

scanlMS :: Monad m => (a -> b -> m a) -> a -> StreamConduit b m a Source

mapAccumWhileS :: Monad m => (a -> s -> Either s (s, b)) -> s -> StreamConduitM a b m s Source

mapAccumWhileMS :: Monad m => (a -> s -> m (Either s (s, b))) -> s -> StreamConduitM a b m s Source

slidingWindowS :: (Monad m, IsSequence seq, Element seq ~ a) => Int -> StreamConduit a m seq Source

filterMS :: Monad m => (a -> m Bool) -> StreamConduit a m a Source

splitOnUnboundedES :: (Monad m, IsSequence seq) => (Element seq -> Bool) -> StreamConduit seq m seq Source

initReplicateS :: Monad m => m seed -> (seed -> m a) -> Int -> StreamProducer m a Source

Streaming versions of Data.Conduit.Combinators.Internal.initReplicate

initRepeatS :: Monad m => m seed -> (seed -> m a) -> StreamProducer m a Source

Streaming versions of Data.Conduit.Combinators.Internal.initRepeat