{-# OPTIONS_GHC -Wno-orphans #-}

module LawfulConversions.Relations.Int32AndWord32 where

import LawfulConversions.Classes
import LawfulConversions.Prelude

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

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

instance IsMany Int32 Word32

instance IsMany Word32 Int32

instance Is Int32 Word32

instance Is Word32 Int32