-- | Defines a type-safe 'Data.Binary.Binary' instance to ensure data is -- decoded with the type it was serialized from. -- -- For usage information, see the "Data.Binary.Typed.Tutorial" module. module Data.Binary.Typed ( -- * Core functions Typed , typed , TypeFormat(..) , erase -- * Useful general helpers , mapTyped , reValue , reType , precache -- * Typed serialization -- ** Encoding , encodeTyped , encodeTypedLike -- ** Decoding , decodeTyped , decodeTypedOrFail , unsafeDecodeTyped ) where import qualified Data.ByteString.Lazy as BSL import Data.Typeable (Typeable) import Data.Binary import Data.Binary.Get (ByteOffset) import Data.Binary.Typed.Internal -- | Modify the value contained in a 'Typed', keeping the same sort of type -- representation. In other words, calling 'mapTyped' on something that is -- typed using 'Hashed' will yield a 'Hashed' value again. -- -- Note: this destroys 'precache'd information, so that values have to be -- 'precache'd again if desired. As a consequence, @'mapTyped' 'id'@ -- can be used to un-'precache' values. mapTyped :: Typeable b => (a -> b) -> Typed a -> Typed b mapTyped f (Typed ty x) = typed (getFormat ty) (f x) -- | Change the value contained in a 'Typed', leaving the type representation -- unchanged. This can be useful to avoid recomputation of the included type -- information, and can improve performance significantly if many individual -- messages are serialized. -- -- Can be seen as a more efficient 'mapTyped' in case @f@ is an endomorphism -- (i.e. has type @a -> a@). reValue :: (a -> a) -> Typed a -> Typed a reValue f (Typed ty x) = Typed ty (f x) -- | Change the way a type is represented inside a 'Typed' value. -- -- @ -- 'reType' format x = 'typed' format ('erase' x) -- @ reType :: Typeable a => TypeFormat -> Typed a -> Typed a reType format (Typed _ty x) = typed format x -- | Encode a 'Typeable' value to 'BSL.ByteString' that includes type -- information. If at all possible, prefer the more efficient 'encodeTypedLike' -- though. -- -- @ -- 'encodeTyped' format value = 'encode' ('typed' format value) -- @ encodeTyped :: (Typeable a, Binary a) => TypeFormat -> a -> BSL.ByteString encodeTyped format value = encode (typed format value) -- | Version of 'encodeTyped' that avoids recomputing the type representation -- of the input by using the one already contained in the first parameter. -- This is usually /much/ more efficient than using 'encode', having a -- computational cost similar to using 'Binary' directly. -- -- @ -- 'encodeTypedLike' ty x -- -- is observationally identical to -- 'encode' ('reValue' ('const' x) ty) -- @ -- -- This function is intended to generate new encoding functions like so: -- -- @ -- encodeInt :: 'Int' -> 'Data.ByteString.Lazy.ByteString' -- encodeInt = 'encodeTypedLike' ('typed' 'Full' 0) -- @ encodeTypedLike :: (Typeable a, Binary a) => Typed a -> a -> BSL.ByteString encodeTypedLike dummy = let (Typed ty _) = precache dummy in encode . Typed ty -- | Decode a typed value, throwing an error at runtime on failure. -- Typed cousin of 'Data.Binary.decode'. -- -- @ -- encoded = 'encodeTyped' 'Full' ("hello", 1 :: 'Int', 2.34 :: 'Double') -- -- -- \ -- 'unsafeDecodeTyped' encoded :: ('String', 'Int', 'Double') -- -- -- (Descriptive) runtime error -- 'unsafeDecodeTyped' encoded :: ('Char', 'Int', 'Double') -- @ unsafeDecodeTyped :: (Typeable a, Binary a) => BSL.ByteString -> a unsafeDecodeTyped = erase . decode -- | Safely decode data, yielding 'Either' an error 'String' or the value, -- along with meta-information of the consumed binary data. -- -- * Typed cousin of 'Data.Binary.decodeOrFail'. -- * Like 'decodeTyped', but with additional data. decodeTypedOrFail :: (Typeable a, Binary a) => BSL.ByteString -> Either (BSL.ByteString, ByteOffset, String) (BSL.ByteString, ByteOffset, a) decodeTypedOrFail input = case decodeOrFail input of Right (rest, offset, value) -> Right (rest, offset, erase value) Left l -> Left l -- | Safely decode data, yielding 'Either' an error 'String' or the value. -- Equivalent to 'decodeTypedOrFail' stripped of the non-essential data. -- -- @ -- encoded = 'encodeTyped' 'Full' ("hello", 1 :: 'Int', 2.34 :: 'Double') -- -- -- Right \: -- 'decodeTyped' encoded :: 'Either' 'String' ('String', 'Int', 'Double') -- -- -- Left "Type error: expected (Char, Int, Double), got (String, Int, Double)" -- 'decodeTyped' encoded :: 'Either' 'String' ('Char', 'Int', 'Double') -- @ decodeTyped :: (Typeable a, Binary a) => BSL.ByteString -> Either String a decodeTyped bs = case decodeTypedOrFail bs of Left (_rest, _offset, err) -> Left err Right (_rest, _offset, value) -> Right value