{-# OPTIONS_GHC -Wno-orphans #-}

module LawfulConversions.Relations.IntAndWord where

import LawfulConversions.Classes
import LawfulConversions.Prelude

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

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

instance IsMany Int Word

instance IsMany Word Int

instance Is Int Word

instance Is Word Int