{-# OPTIONS_GHC -Wno-orphans #-}

module LawfulConversions.Relations.Int8AndWord8 where

import LawfulConversions.Classes
import LawfulConversions.Prelude

instance IsSome Int8 Word8 where
  to :: Word8 -> Int8
to = Word8 -> Int8
forall a b. (Integral a, Num b) => a -> b
fromIntegral

instance IsSome Word8 Int8 where
  to :: Int8 -> Word8
to = Int8 -> Word8
forall a b. (Integral a, Num b) => a -> b
fromIntegral

instance IsMany Int8 Word8

instance IsMany Word8 Int8

instance Is Int8 Word8

instance Is Word8 Int8