| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Streaming.Binary
Description
This module implements a method to ingest a sequence of Data.Binary encoded records using bounded memory. Minimal example:
{-# LANGUAGE TypeApplications #-}
import Data.Function ((&))
import qualified Data.ByteString.Streaming as Q
import Streaming
import Streaming.Binary
import qualified Streaming.Prelude as S
-- Interpret all bytes on stdin as a sequence of integers.
-- Print them on-the-fly on stdout.
main = Q.getContents & decoded @Int & S.print