{-# OPTIONS_GHC -Wno-orphans #-}

module LawfulConversions.Relations.Int64AndWord64 where

import LawfulConversions.Classes
import LawfulConversions.Prelude

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

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

instance IsMany Int64 Word64

instance IsMany Word64 Int64

instance Is Int64 Word64

instance Is Word64 Int64