module Saturn.Unstable.Extra.Int where

import qualified Data.Bits as Bits
import qualified Data.Word as Word

fromWord8 :: Word.Word8 -> Int
fromWord8 :: Word8 -> Int
fromWord8 = forall a b. (Integral a, Num b) => a -> b
fromIntegral

toWord8 :: Int -> Maybe Word.Word8
toWord8 :: Int -> Maybe Word8
toWord8 = forall a b.
(Integral a, Integral b, Bits a, Bits b) =>
a -> Maybe b
Bits.toIntegralSized