module Codec.Audio.WavPack.Words
( WordsData(..)
- , getWordsLossless
+-- , getWordsLossless
)
where
import Codec.Audio.WavPack.Entropy
import Codec.Audio.WavPack.Internal
+import Control.Monad.ST
import Data.Bits
import Data.Bitstream.Generic (Bitstream)
import qualified Data.Bitstream.Generic as B
import Data.Int
+import Data.STRef
import qualified Data.Vector.Generic as GV
import qualified Data.Vector.Generic.Mutable as MV
import Data.Vector.Generic.New (New)
-- lossless only ('edErrorLimit' ≡ 0). Also, rather than obtaining a
-- single sample, it can be used to obtain an entire buffer of either
-- mono or stereo samples.
+{-
getWordsLossless ∷ ∀bs v. (Bitstream bs, GV.Vector v Int32)
⇒ Bool -- ^ Is the stream monaural?
→ WordsData
| isMono = w { wdEntropyData = (e, snd $ wdEntropyData w) }
| n `testBit` 0 = w { wdEntropyData = (e, snd $ wdEntropyData w) }
| otherwise = w { wdEntropyData = (fst $ wdEntropyData w, e) }
+-}
-- | Read a single unsigned value from the specified bitstream with a
-- value from 0 to maxCode. If there are exactly a power of two number
-- of possible codes then this will read a fixed number of bits;
-- otherwise it reads the minimum number of bits and then determines
-- whether another bit is needed to define the code.
-readCode ∷ Bitstream bs ⇒ bs → Word32 → (# Word32, bs #)
+readCode ∷ Bitstream bs ⇒ STRef s bs → Word32 → ST s Word32
{-# INLINEABLE readCode #-}
-readCode bs 0 = (# 0, bs #)
-readCode bs 1 = (# b2n (B.head bs), B.tail bs #)
+readCode bs 0 = return 0
+readCode bs 1 = fmap b2n $ takeHead bs
readCode bs maxCode
- = let !bitCount = countBits maxCode
- !extras = bit bitCount - maxCode - 1
- !code = B.toBits (B.take (bitCount - 1) bs)
- (# code', bitCount' #)
- = if code ≥ extras then
- (# (code `shiftL` 1)
- - extras
- + b2n (bs B.!! bitCount)
- , bitCount #)
- else
- (# code, bitCount - 1 #)
- !bs' = B.drop bitCount' bs
- in
- (# code', bs' #)
+ = do let bitCount = countBits maxCode
+ extras = bit bitCount - maxCode - 1
+ code ← takeBits bs (bitCount - 1)
+ if code ≥ extras then
+ do nextBit ← takeHead bs
+ return $ (code `shiftL` 1) - extras + b2n nextBit
+ else
+ return code
+
+takeHead ∷ Bitstream bs ⇒ STRef s bs → ST s Bool
+{-# INLINEABLE takeHead #-}
+takeHead bsr
+ = do bs ← readSTRef bsr
+ writeSTRef bsr (B.tail bs)
+ return (B.head bs)
+
+takeBits ∷ (Integral n, Bitstream bs, Bits a) ⇒ STRef s bs → n → ST s a
+{-# INLINEABLE takeBits #-}
+takeBits bsr n
+ = do bs ← readSTRef bsr
+ writeSTRef bsr (B.drop n bs)
+ return (B.toBits (B.take n bs))