module Sound.OSC.Coding.Byte where
import Data.Bits
import Data.Int
import Data.Word
import System.IO
import qualified Data.Binary as Binary
import qualified Data.Binary.Get as Get
import qualified Data.Binary.Put as Put
import qualified Data.ByteString as S
import qualified Data.ByteString.Char8 as S.C
import qualified Data.ByteString.Lazy as L
import qualified Data.ByteString.Lazy.Char8 as L.C
import qualified Sound.OSC.Coding.Cast as Cast
import Sound.OSC.Coding.Convert
encode_i8 :: Int -> L.ByteString
encode_i8 = Binary.encode . int_to_int8
encode_u8 :: Int -> L.ByteString
encode_u8 = Binary.encode . int_to_word8
encode_w16 :: Word16 -> L.ByteString
encode_w16 = Binary.encode
encode_w16_le :: Word16 -> L.ByteString
encode_w16_le = Put.runPut . Put.putWord16le
encode_u16 :: Int -> L.ByteString
encode_u16 = encode_w16 . int_to_word16
encode_u16_le :: Int -> L.ByteString
encode_u16_le = encode_w16_le . int_to_word16
encode_i16 :: Int -> L.ByteString
encode_i16 = Binary.encode . int_to_int16
encode_i32 :: Int -> L.ByteString
encode_i32 = Binary.encode . int_to_int32
encode_w32 :: Word32 -> L.ByteString
encode_w32 = Binary.encode
encode_u32 :: Int -> L.ByteString
encode_u32 = encode_w32 . int_to_word32
encode_w32_le :: Word32 -> L.ByteString
encode_w32_le = Put.runPut . Put.putWord32le
encode_u32_le :: Int -> L.ByteString
encode_u32_le = encode_w32_le . int_to_word32
encode_i64 :: Int64 -> L.ByteString
encode_i64 = Binary.encode
encode_u64 :: Word64 -> L.ByteString
encode_u64 = Binary.encode
encode_f32 :: Float -> L.ByteString
encode_f32 = Binary.encode . Cast.f32_w32
encode_f32_le :: Float -> L.ByteString
encode_f32_le = Put.runPut . Put.putWord32le . Cast.f32_w32
encode_f64 :: Double -> L.ByteString
encode_f64 = Binary.encode . Cast.f64_w64
encode_str :: S.C.ByteString -> L.ByteString
{-# INLINE encode_str #-}
encode_str = L.pack . S.unpack
decode_u8 :: L.ByteString -> Int
decode_u8 = word8_to_int . L.head
decode_i8 :: L.ByteString -> Int
decode_i8 = int8_to_int . Binary.decode
decode_word16 :: L.ByteString -> Word16
decode_word16 = Binary.decode
decode_u16 :: L.ByteString -> Int
decode_u16 = word16_to_int . decode_word16
decode_word16_le :: L.ByteString -> Word16
decode_word16_le = Get.runGet Get.getWord16le
decode_u16_le :: L.ByteString -> Int
decode_u16_le = word16_to_int . decode_word16_le
decode_int16 :: L.ByteString -> Int16
decode_int16 = Binary.decode
decode_i16 :: L.ByteString -> Int
decode_i16 = int16_to_int . decode_int16
decode_i16_le :: L.ByteString -> Int
decode_i16_le = decode_i16 . L.reverse
decode_i32 :: L.ByteString -> Int
decode_i32 = int32_to_int . Binary.decode
decode_word32 :: L.ByteString -> Word32
decode_word32 = Binary.decode
decode_u32 :: L.ByteString -> Int
decode_u32 = word32_to_int . decode_word32
decode_word32_le :: L.ByteString -> Word32
decode_word32_le = Get.runGet Get.getWord32le
decode_u32_le :: L.ByteString -> Int
decode_u32_le = word32_to_int . decode_word32_le
decode_i64 :: L.ByteString -> Int64
decode_i64 = Binary.decode
decode_u64 :: L.ByteString -> Word64
decode_u64 = Binary.decode
decode_f32 :: L.ByteString -> Float
decode_f32 = Cast.w32_f32 . decode_word32
decode_f32_le :: L.ByteString -> Float
decode_f32_le = Cast.w32_f32 . decode_word32_le
decode_f64 :: L.ByteString -> Double
decode_f64 b = Cast.w64_f64 (Binary.decode b :: Word64)
decode_str :: L.ByteString -> S.C.ByteString
{-# INLINE decode_str #-}
decode_str = S.C.pack . L.C.unpack
read_i8 :: Handle -> IO Int
read_i8 = fmap decode_i8 . flip L.hGet 1
read_i16 :: Handle -> IO Int
read_i16 = fmap decode_i16 . flip L.hGet 2
read_i32 :: Handle -> IO Int
read_i32 = fmap decode_i32 . flip L.hGet 4
read_u32 :: Handle -> IO Int
read_u32 = fmap decode_u32 . flip L.hGet 4
read_u32_le :: Handle -> IO Int
read_u32_le = fmap decode_u32_le . flip L.hGet 4
read_f32 :: Handle -> IO Float
read_f32 = fmap decode_f32 . flip L.hGet 4
read_pstr :: Handle -> IO S.C.ByteString
read_pstr h = do
n <- fmap decode_u8 (L.hGet h 1)
fmap decode_str (L.hGet h n)
write_u32 :: Handle -> Int -> IO ()
write_u32 h = L.hPut h . encode_u32
write_u32_le :: Handle -> Int -> IO ()
write_u32_le h = L.hPut h . encode_u32_le
bundleHeader_strict :: S.C.ByteString
bundleHeader_strict = S.C.pack "#bundle\0"
bundleHeader :: L.ByteString
{-# INLINE bundleHeader #-}
bundleHeader = L.C.fromChunks [bundleHeader_strict]
align :: (Num i,Bits i) => i -> i
{-# INLINE align #-}
align n = ((n + 3) .&. complement 3) - n