module Botan.ZFEC where
import Botan.Low.ZFEC (ZFECShare(..))
import qualified Botan.Low.ZFEC as Low
import Botan.Prelude
zfecEncode :: Int -> Int -> ByteString -> [ZFECShare]
zfecEncode :: Int -> Int -> ByteString -> [ZFECShare]
zfecEncode = (Int -> Int -> ByteString -> IO [ZFECShare])
-> Int -> Int -> ByteString -> [ZFECShare]
forall a b c d. (a -> b -> c -> IO d) -> a -> b -> c -> d
unsafePerformIO3 Int -> Int -> ByteString -> IO [ZFECShare]
Low.zfecEncode
zfecDecode :: Int -> Int -> [ZFECShare] -> ByteString
zfecDecode :: Int -> Int -> [ZFECShare] -> ByteString
zfecDecode = (Int -> Int -> [ZFECShare] -> IO ByteString)
-> Int -> Int -> [ZFECShare] -> ByteString
forall a b c d. (a -> b -> c -> IO d) -> a -> b -> c -> d
unsafePerformIO3 Int -> Int -> [ZFECShare] -> IO ByteString
Low.zfecDecode