{-# OPTIONS_GHC -Wno-orphans #-}

module LawfulConversions.Relations.Int16AndWord16 where

import LawfulConversions.Classes
import LawfulConversions.Prelude

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

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

instance IsMany Int16 Word16

instance IsMany Word16 Int16

instance Is Int16 Word16

instance Is Word16 Int16