module Codec.Bytable (
Bytable(..),
Parsable(..),
BytableM(..), evalBytableM, execBytableM,
head, take, null, list, addLen,
) where
import Prelude hiding (take, head, null)
import Control.Applicative(Applicative(..), (<$>))
import Control.Monad (unless, liftM, ap)
import Data.Word (Word8)
import qualified Data.ByteString as BS
data BytableM a = BytableM {
runBytableM :: BS.ByteString -> Either String (a, BS.ByteString) }
evalBytableM :: BytableM a -> BS.ByteString -> Either String a
evalBytableM m bs = fst <$> runBytableM m bs
execBytableM :: BytableM a -> BS.ByteString -> Either String BS.ByteString
execBytableM m bs = snd <$> runBytableM m bs
instance Monad BytableM where
return x = BytableM $ \bs -> Right (x, bs)
BytableM m1 >>= f = BytableM $ \bs -> do
(x, bs') <- m1 bs
runBytableM (f x) bs'
fail = BytableM . const . Left
instance Functor BytableM where
fmap = liftM
instance Applicative BytableM where
pure = return
(<*>) = ap
class Bytable b where
fromByteString :: BS.ByteString -> Either String b
toByteString :: b -> BS.ByteString
instance Bytable Word8 where
fromByteString "" = Right 0
fromByteString bs
| [w] <- BS.unpack bs = Right w
fromByteString _ = Left "Codec.Bytable.BigEndian: Bytable Word8: too large"
toByteString = BS.pack . (: [])
instance Bytable BS.ByteString where
fromByteString = Right
toByteString = id
class Parsable p where
parse :: BytableM p
head :: BytableM Word8
head = BytableM $ \bs -> case BS.uncons bs of
Just (h, t) -> Right (h, t)
_ -> Left "Bytable.head: null"
take :: Bytable b => Int -> BytableM b
take n = BytableM $ \bs -> do
unless (BS.length bs >= n) . Left $
"Bytable.take: length shorter than " ++ show n
let (x, bs') = BS.splitAt n bs
(, bs') <$> fromByteString x
null :: BytableM Bool
null = BytableM $ \bs -> Right (BS.null bs, bs)
list :: Int -> BytableM b -> BytableM [b]
list n m = do
bs <- take n
case evalBytableM lst bs of
Right xs -> return xs
Left msg -> fail msg
where
lst = do
e <- null
if e then return [] else (:) <$> m <*> lst
addLen :: (Bytable n, Num n) => n -> BS.ByteString -> BS.ByteString
addLen t bs =
toByteString (fromIntegral (BS.length bs) `asTypeOf` t) `BS.append` bs