{-# LANGUAGE TemplateHaskell #-}

module Rattletrap.Type.Int32le
  ( Int32le(..)
  )
where

import Rattletrap.Type.Common

newtype Int32le = Int32le
  { Int32le -> Int32
int32leValue :: Int32
  } deriving (Int32le -> Int32le -> Bool
(Int32le -> Int32le -> Bool)
-> (Int32le -> Int32le -> Bool) -> Eq Int32le
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Int32le -> Int32le -> Bool
$c/= :: Int32le -> Int32le -> Bool
== :: Int32le -> Int32le -> Bool
$c== :: Int32le -> Int32le -> Bool
Eq, Eq Int32le
Eq Int32le
-> (Int32le -> Int32le -> Ordering)
-> (Int32le -> Int32le -> Bool)
-> (Int32le -> Int32le -> Bool)
-> (Int32le -> Int32le -> Bool)
-> (Int32le -> Int32le -> Bool)
-> (Int32le -> Int32le -> Int32le)
-> (Int32le -> Int32le -> Int32le)
-> Ord Int32le
Int32le -> Int32le -> Bool
Int32le -> Int32le -> Ordering
Int32le -> Int32le -> Int32le
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Int32le -> Int32le -> Int32le
$cmin :: Int32le -> Int32le -> Int32le
max :: Int32le -> Int32le -> Int32le
$cmax :: Int32le -> Int32le -> Int32le
>= :: Int32le -> Int32le -> Bool
$c>= :: Int32le -> Int32le -> Bool
> :: Int32le -> Int32le -> Bool
$c> :: Int32le -> Int32le -> Bool
<= :: Int32le -> Int32le -> Bool
$c<= :: Int32le -> Int32le -> Bool
< :: Int32le -> Int32le -> Bool
$c< :: Int32le -> Int32le -> Bool
compare :: Int32le -> Int32le -> Ordering
$ccompare :: Int32le -> Int32le -> Ordering
$cp1Ord :: Eq Int32le
Ord, Int -> Int32le -> ShowS
[Int32le] -> ShowS
Int32le -> String
(Int -> Int32le -> ShowS)
-> (Int32le -> String) -> ([Int32le] -> ShowS) -> Show Int32le
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Int32le] -> ShowS
$cshowList :: [Int32le] -> ShowS
show :: Int32le -> String
$cshow :: Int32le -> String
showsPrec :: Int -> Int32le -> ShowS
$cshowsPrec :: Int -> Int32le -> ShowS
Show)

$(deriveJson ''Int32le)