{-# LANGUAGE TupleSections #-}
{-# options_ghc -Wno-unused-imports #-}
module JSONL.Conduit (
jsonToLBSC
, sinkFileC
, appendFileC
, jsonFromLBSC
, sourceFileC
, sourceFileC_
) where
import Data.Void (Void)
import Control.Monad.IO.Class (MonadIO(..))
import System.IO (IOMode(..), Handle, openBinaryFile)
import Data.Aeson (ToJSON(..), FromJSON(..), eitherDecode' )
import qualified Data.ByteString as BS (ByteString, null)
import qualified Data.ByteString.Builder as BBS (toLazyByteString, Builder)
import qualified Data.ByteString.Internal as BS (c2w)
import qualified Data.ByteString.Char8 as BS8 (span, drop, putStrLn, putStr)
import qualified Data.ByteString.Lazy as LBS (ByteString, drop, span, toStrict, fromStrict)
import qualified Conduit as C (ConduitT, runConduit, sourceFile, sinkFile, await, yield, mapC, unfoldC, foldMapC, foldlC, printC, sinkIOHandle)
import Conduit ( (.|) , MonadResource)
import JSONL (jsonLine)
jsonToLBSC :: (ToJSON a, Monad m) => C.ConduitT a o m LBS.ByteString
jsonToLBSC :: forall a (m :: * -> *) o.
(ToJSON a, Monad m) =>
ConduitT a o m ByteString
jsonToLBSC = Builder -> ByteString
BBS.toLazyByteString forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a (m :: * -> *) o.
(ToJSON a, Monad m) =>
ConduitT a o m Builder
jsonToBuilderC
jsonToBuilderC :: (ToJSON a, Monad m) => C.ConduitT a o m BBS.Builder
jsonToBuilderC :: forall a (m :: * -> *) o.
(ToJSON a, Monad m) =>
ConduitT a o m Builder
jsonToBuilderC = forall (m :: * -> *) b a o.
(Monad m, Monoid b) =>
(a -> b) -> ConduitT a o m b
C.foldMapC forall a. ToJSON a => a -> Builder
jsonLine
sinkFileC :: (ToJSON a, MonadResource m) =>
FilePath
-> C.ConduitT a o m ()
sinkFileC :: forall a (m :: * -> *) o.
(ToJSON a, MonadResource m) =>
FilePath -> ConduitT a o m ()
sinkFileC FilePath
fpath = forall (m :: * -> *) a b. Monad m => (a -> b) -> ConduitT a b m ()
C.mapC forall a. ToJSON a => a -> ByteString
encodeJSONL forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.|
forall (m :: * -> *) o.
MonadResource m =>
FilePath -> ConduitT ByteString o m ()
C.sinkFile FilePath
fpath
appendFileC :: (ToJSON a, MonadResource m) =>
FilePath
-> C.ConduitT a o m ()
appendFileC :: forall a (m :: * -> *) o.
(ToJSON a, MonadResource m) =>
FilePath -> ConduitT a o m ()
appendFileC FilePath
fpath = forall (m :: * -> *) a b. Monad m => (a -> b) -> ConduitT a b m ()
C.mapC forall a. ToJSON a => a -> ByteString
encodeJSONL forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.|
forall (m :: * -> *) o.
MonadResource m =>
IO Handle -> ConduitT ByteString o m ()
C.sinkIOHandle (FilePath -> IOMode -> IO Handle
openBinaryFile FilePath
fpath IOMode
AppendMode)
encodeJSONL :: ToJSON a => a -> BS.ByteString
encodeJSONL :: forall a. ToJSON a => a -> ByteString
encodeJSONL = ByteString -> ByteString
LBS.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> ByteString
BBS.toLazyByteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. ToJSON a => a -> Builder
jsonLine
sourceFileC :: (MonadResource m, FromJSON a) =>
FilePath
-> C.ConduitT () a m ()
sourceFileC :: forall (m :: * -> *) a.
(MonadResource m, FromJSON a) =>
FilePath -> ConduitT () a m ()
sourceFileC FilePath
fpath = forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i ByteString m ()
C.sourceFile FilePath
fpath forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.|
forall (m :: * -> *) a.
(Monad m, FromJSON a) =>
ConduitT ByteString a m ()
parseChunk
parseChunk :: (Monad m, FromJSON a) => C.ConduitT BS.ByteString a m ()
parseChunk :: forall (m :: * -> *) a.
(Monad m, FromJSON a) =>
ConduitT ByteString a m ()
parseChunk = forall {o} {m :: * -> *}.
(FromJSON o, Monad m) =>
ByteString -> ConduitT ByteString o m ()
go forall a. Monoid a => a
mempty
where
go :: ByteString -> ConduitT ByteString o m ()
go ByteString
acc =
if Bool -> Bool
not (ByteString -> Bool
BS.null ByteString
acc)
then
case forall a.
FromJSON a =>
ByteString -> Either FilePath (a, ByteString)
chopDecode ByteString
acc of
Left FilePath
_ -> forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Right (o
y, ByteString
srest) -> do
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
C.yield o
y
ByteString -> ConduitT ByteString o m ()
go ByteString
srest
else do
Maybe ByteString
mc <- forall (m :: * -> *) i o. Monad m => ConduitT i o m (Maybe i)
C.await
case Maybe ByteString
mc of
Maybe ByteString
Nothing -> forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Just ByteString
x -> do
let
acc' :: ByteString
acc' = ByteString
acc forall a. Semigroup a => a -> a -> a
<> ByteString
x
case forall a.
FromJSON a =>
ByteString -> Either FilePath (a, ByteString)
chopDecode ByteString
acc' of
Left FilePath
_ -> forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Right (o
y, ByteString
srest) -> do
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
C.yield o
y
ByteString -> ConduitT ByteString o m ()
go ByteString
srest
sourceFileC_ :: MonadResource m =>
FilePath
-> C.ConduitT () LBS.ByteString m ()
sourceFileC_ :: forall (m :: * -> *).
MonadResource m =>
FilePath -> ConduitT () ByteString m ()
sourceFileC_ FilePath
fpath = forall (m :: * -> *) i.
MonadResource m =>
FilePath -> ConduitT i ByteString m ()
C.sourceFile FilePath
fpath forall (m :: * -> *) a b c r.
Monad m =>
ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r
.|
forall (m :: * -> *).
Monad m =>
ConduitT ByteString ByteString m ()
toLazyLines
toLazyLines :: (Monad m) => C.ConduitT BS.ByteString LBS.ByteString m ()
toLazyLines :: forall (m :: * -> *).
Monad m =>
ConduitT ByteString ByteString m ()
toLazyLines = forall {m :: * -> *}.
Monad m =>
ByteString -> ConduitT ByteString ByteString m ()
go forall a. Monoid a => a
mempty
where
go :: ByteString -> ConduitT ByteString ByteString m ()
go ByteString
acc =
if Bool -> Bool
not (ByteString -> Bool
BS.null ByteString
acc)
then
do
let
(ByteString
y, ByteString
srest) = ByteString -> (ByteString, ByteString)
chop ByteString
acc
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
C.yield ByteString
y
ByteString -> ConduitT ByteString ByteString m ()
go ByteString
srest
else
do
Maybe ByteString
mc <- forall (m :: * -> *) i o. Monad m => ConduitT i o m (Maybe i)
C.await
case Maybe ByteString
mc of
Maybe ByteString
Nothing -> forall (f :: * -> *) a. Applicative f => a -> f a
pure ()
Just ByteString
x -> do
let
acc' :: ByteString
acc' = ByteString
acc forall a. Semigroup a => a -> a -> a
<> ByteString
x
(ByteString
y, ByteString
srest) = ByteString -> (ByteString, ByteString)
chop ByteString
acc'
forall (m :: * -> *) o i. Monad m => o -> ConduitT i o m ()
C.yield ByteString
y
ByteString -> ConduitT ByteString ByteString m ()
go ByteString
srest
chop :: BS.ByteString -> (LBS.ByteString, BS.ByteString)
chop :: ByteString -> (ByteString, ByteString)
chop ByteString
acc = (ByteString -> ByteString
LBS.fromStrict ByteString
s, ByteString
srest)
where
(ByteString
s, ByteString
srest) = ByteString -> (ByteString, ByteString)
chopBS8 ByteString
acc
chopDecode :: FromJSON a =>
BS.ByteString -> Either String (a, BS.ByteString)
chopDecode :: forall a.
FromJSON a =>
ByteString -> Either FilePath (a, ByteString)
chopDecode ByteString
acc = (, ByteString
srest) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a. FromJSON a => ByteString -> Either FilePath a
eitherDecode' (ByteString -> ByteString
LBS.fromStrict ByteString
s)
where
(ByteString
s, ByteString
srest) = ByteString -> (ByteString, ByteString)
chopBS8 ByteString
acc
jsonFromLBSC :: (FromJSON a, Monad m) => LBS.ByteString -> C.ConduitT Void a m ()
jsonFromLBSC :: forall a (m :: * -> *).
(FromJSON a, Monad m) =>
ByteString -> ConduitT Void a m ()
jsonFromLBSC = forall (m :: * -> *) b a i.
Monad m =>
(b -> Maybe (a, b)) -> b -> ConduitT i a m ()
C.unfoldC forall {a}. FromJSON a => ByteString -> Maybe (a, ByteString)
mk
where
mk :: ByteString -> Maybe (a, ByteString)
mk ByteString
lbs = case forall a. FromJSON a => ByteString -> Either FilePath a
eitherDecode' ByteString
s of
Right a
x -> forall a. a -> Maybe a
Just (a
x, ByteString
srest)
Left FilePath
_ -> forall a. Maybe a
Nothing
where
(ByteString
s, ByteString
srest) = ByteString -> (ByteString, ByteString)
chopLBS ByteString
lbs
chopBS8 :: BS.ByteString -> (BS.ByteString, BS.ByteString)
chopBS8 :: ByteString -> (ByteString, ByteString)
chopBS8 ByteString
lbs = (ByteString
s, Int -> ByteString -> ByteString
BS8.drop Int
1 ByteString
srest)
where (ByteString
s, ByteString
srest) = (Char -> Bool) -> ByteString -> (ByteString, ByteString)
BS8.span (forall a. Eq a => a -> a -> Bool
/= Char
'\n') ByteString
lbs
chopLBS :: LBS.ByteString -> (LBS.ByteString, LBS.ByteString)
chopLBS :: ByteString -> (ByteString, ByteString)
chopLBS ByteString
lbs = (ByteString
s, Int64 -> ByteString -> ByteString
LBS.drop Int64
1 ByteString
srest)
where (ByteString
s, ByteString
srest) = (Word8 -> Bool) -> ByteString -> (ByteString, ByteString)
LBS.span (forall a. Eq a => a -> a -> Bool
/= Char -> Word8
BS.c2w Char
'\n') ByteString
lbs