{-# language BangPatterns #-}
{-# language BlockArguments #-}
{-# language MagicHash #-}
{-# language NamedFieldPuns #-}
{-# language ScopedTypeVariables #-}
{-# language TypeApplications #-}
{-# language UnliftedFFITypes #-}
{-# language UnboxedTuples #-}
module Data.Bytes.Byte
( count
, split
, splitU
, splitNonEmpty
, splitStream
, splitInit
, splitInitU
, split1
, split2
, split3
, split4
) where
import Prelude hiding (length)
import Control.Monad.ST (runST)
import Control.Monad.ST.Run (runPrimArrayST)
import Data.Bytes.Types (Bytes(..))
import Data.List.NonEmpty (NonEmpty((:|)))
import Data.Primitive (PrimArray(..),MutablePrimArray(..),ByteArray(..))
import Data.Primitive.Unlifted.Array (UnliftedArray)
import Data.Tuple.Types (IntPair(IntPair))
import Data.Vector.Fusion.Stream.Monadic (Stream(Stream),Step(Yield,Done))
import Data.Word (Word8)
import GHC.Exts (ByteArray#,MutableByteArray#,Int#,Int(I#))
import GHC.IO (unsafeIOToST)
import qualified Data.Primitive as PM
import qualified Data.Primitive.Unlifted.Array as PM
import qualified GHC.Exts as Exts
count :: Word8 -> Bytes -> Int
count !b (Bytes{array=ByteArray arr,offset,length}) =
count_ba arr offset length b
splitU :: Word8 -> Bytes -> UnliftedArray ByteArray
splitU !w !bs =
let !lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens
in splitCommonU lens lensSz bs
splitInitU :: Word8 -> Bytes -> UnliftedArray ByteArray
splitInitU !w !bs =
let !lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens
in splitCommonU lens (lensSz - 1) bs
splitCommonU ::
PrimArray Int
-> Int
-> Bytes
-> UnliftedArray ByteArray
splitCommonU !lens !lensSz Bytes{array,offset=arrIx0} = runST do
dst <- PM.unsafeNewUnliftedArray lensSz
let go !lenIx !arrIx = if lenIx < lensSz
then do
let !len = PM.indexPrimArray lens lenIx
buf <- PM.newByteArray len
PM.copyByteArray buf 0 array arrIx len
buf' <- PM.unsafeFreezeByteArray buf
PM.writeUnliftedArray dst lenIx buf'
go (lenIx + 1) (arrIx + len + 1)
else pure ()
go 0 arrIx0
PM.unsafeFreezeUnliftedArray dst
split :: Word8 -> Bytes -> [Bytes]
{-# inline split #-}
split !w !bs@Bytes{array,offset=arrIx0} = Exts.build
(\g x0 ->
let go !lenIx !arrIx = if lenIx < lensSz
then let !len = PM.indexPrimArray lens lenIx in
g (Bytes array arrIx len) (go (lenIx + 1) (arrIx + len + 1))
else x0
in go 0 arrIx0
)
where
!lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens
splitStream :: forall m. Applicative m => Word8 -> Bytes -> Stream m Bytes
{-# inline [1] splitStream #-}
splitStream !w !bs@Bytes{array,offset=arrIx0} = Stream step (IntPair 0 arrIx0)
where
!lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens
{-# inline [0] step #-}
step :: IntPair -> m (Step IntPair Bytes)
step (IntPair lenIx arrIx) = if lenIx < lensSz
then do
let !len = PM.indexPrimArray lens lenIx
!element = Bytes array arrIx len
!acc = IntPair (lenIx + 1) (arrIx + len + 1)
pure (Yield element acc)
else pure Done
splitNonEmpty :: Word8 -> Bytes -> NonEmpty Bytes
{-# inline splitNonEmpty #-}
splitNonEmpty !w !bs@Bytes{array,offset=arrIx0} =
Bytes array arrIx0 len0 :| Exts.build
(\g x0 ->
let go !lenIx !arrIx = if lenIx < lensSz
then let !len = PM.indexPrimArray lens lenIx in
g (Bytes array arrIx len) (go (lenIx + 1) (arrIx + len + 1))
else x0
in go 1 (1 + (arrIx0 + len0))
)
where
!lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens
!len0 = PM.indexPrimArray lens 0 :: Int
splitInit :: Word8 -> Bytes -> [Bytes]
{-# inline splitInit #-}
splitInit !w !bs@Bytes{array,offset=arrIx0} = Exts.build
(\g x0 ->
let go !lenIx !arrIx = if lenIx < lensSz
then let !len = PM.indexPrimArray lens lenIx in
g (Bytes array arrIx len) (go (lenIx + 1) (arrIx + len + 1))
else x0
in go 0 arrIx0
)
where
!lens = splitLengthsAlt w bs
!lensSz = PM.sizeofPrimArray lens - 1
splitLengthsAlt :: Word8 -> Bytes -> PrimArray Int
splitLengthsAlt b Bytes{array=ByteArray arr#,offset=off,length=len} = runPrimArrayST do
let !n = count_ba arr# off len b
dst@(MutablePrimArray dst# ) :: MutablePrimArray s Int <- PM.newPrimArray (n + 1)
total <- unsafeIOToST (memchr_ba_many arr# off len dst# n b)
PM.writePrimArray dst n (len - total)
PM.unsafeFreezePrimArray dst
foreign import ccall unsafe "bs_custom.h memchr_ba_many" memchr_ba_many
:: ByteArray# -> Int -> Int -> MutableByteArray# s -> Int -> Word8 -> IO Int
foreign import ccall unsafe "bs_custom.h count_ba" count_ba
:: ByteArray# -> Int -> Int -> Word8 -> Int
split1 :: Word8 -> Bytes -> Maybe (Bytes,Bytes)
{-# inline split1 #-}
split1 w b@(Bytes arr off len) = case elemIndexLoop# w b of
(-1#) -> Nothing
i# -> let i = I# i# in
Just (Bytes arr off (i - off), Bytes arr (i + 1) (len - (1 + i - off)))
split2 :: Word8 -> Bytes -> Maybe (Bytes,Bytes,Bytes)
{-# inline split2 #-}
split2 w b@(Bytes arr off len) = case elemIndexLoop# w b of
(-1#) -> Nothing
i# -> let i = I# i# in
case elemIndexLoop# w (Bytes arr (i + 1) (len - (1 + i - off))) of
(-1#) -> Nothing
j# -> let j = I# j# in Just
( Bytes arr off (i - off)
, Bytes arr (i + 1) (j - (i + 1))
, Bytes arr (j + 1) (len - (1 + j - off))
)
split3 :: Word8 -> Bytes -> Maybe (Bytes,Bytes,Bytes,Bytes)
{-# inline split3 #-}
split3 w b@(Bytes arr off len) = case elemIndexLoop# w b of
(-1#) -> Nothing
i# -> let i = I# i# in
case elemIndexLoop# w (Bytes arr (i + 1) (len - (1 + i - off))) of
(-1#) -> Nothing
j# -> let j = I# j# in
case elemIndexLoop# w (Bytes arr (j + 1) (len - (1 + j - off))) of
(-1#) -> Nothing
k# -> let k = I# k# in Just
( Bytes arr off (i - off)
, Bytes arr (i + 1) (j - (i + 1))
, Bytes arr (j + 1) (k - (j + 1))
, Bytes arr (k + 1) (len - (1 + k - off))
)
split4 :: Word8 -> Bytes -> Maybe (Bytes,Bytes,Bytes,Bytes,Bytes)
{-# inline split4 #-}
split4 w b@(Bytes arr off len) = case elemIndexLoop# w b of
(-1#) -> Nothing
i# -> let i = I# i# in
case elemIndexLoop# w (Bytes arr (i + 1) (len - (1 + i - off))) of
(-1#) -> Nothing
j# -> let j = I# j# in
case elemIndexLoop# w (Bytes arr (j + 1) (len - (1 + j - off))) of
(-1#) -> Nothing
k# -> let k = I# k# in
case elemIndexLoop# w (Bytes arr (k + 1) (len - (1 + k - off))) of
(-1#) -> Nothing
m# -> let m = I# m# in Just
( Bytes arr off (i - off)
, Bytes arr (i + 1) (j - (i + 1))
, Bytes arr (j + 1) (k - (j + 1))
, Bytes arr (k + 1) (m - (k + 1))
, Bytes arr (m + 1) (len - (1 + m - off))
)
elemIndexLoop# :: Word8 -> Bytes -> Int#
elemIndexLoop# !w (Bytes arr off@(I# off# ) len) = case len of
0 -> (-1#)
_ -> if PM.indexByteArray arr off == w
then off#
else elemIndexLoop# w (Bytes arr (off + 1) (len - 1))