{-# LANGUAGE TemplateHaskell #-}

module Rattletrap.Type.Int8le
  ( Int8le(..)
  )
where

import Rattletrap.Type.Common

newtype Int8le = Int8le
  { Int8le -> Int8
int8leValue :: Int8
  } deriving (Int8le -> Int8le -> Bool
(Int8le -> Int8le -> Bool)
-> (Int8le -> Int8le -> Bool) -> Eq Int8le
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Int8le -> Int8le -> Bool
$c/= :: Int8le -> Int8le -> Bool
== :: Int8le -> Int8le -> Bool
$c== :: Int8le -> Int8le -> Bool
Eq, Eq Int8le
Eq Int8le
-> (Int8le -> Int8le -> Ordering)
-> (Int8le -> Int8le -> Bool)
-> (Int8le -> Int8le -> Bool)
-> (Int8le -> Int8le -> Bool)
-> (Int8le -> Int8le -> Bool)
-> (Int8le -> Int8le -> Int8le)
-> (Int8le -> Int8le -> Int8le)
-> Ord Int8le
Int8le -> Int8le -> Bool
Int8le -> Int8le -> Ordering
Int8le -> Int8le -> Int8le
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 :: Int8le -> Int8le -> Int8le
$cmin :: Int8le -> Int8le -> Int8le
max :: Int8le -> Int8le -> Int8le
$cmax :: Int8le -> Int8le -> Int8le
>= :: Int8le -> Int8le -> Bool
$c>= :: Int8le -> Int8le -> Bool
> :: Int8le -> Int8le -> Bool
$c> :: Int8le -> Int8le -> Bool
<= :: Int8le -> Int8le -> Bool
$c<= :: Int8le -> Int8le -> Bool
< :: Int8le -> Int8le -> Bool
$c< :: Int8le -> Int8le -> Bool
compare :: Int8le -> Int8le -> Ordering
$ccompare :: Int8le -> Int8le -> Ordering
$cp1Ord :: Eq Int8le
Ord, Int -> Int8le -> ShowS
[Int8le] -> ShowS
Int8le -> String
(Int -> Int8le -> ShowS)
-> (Int8le -> String) -> ([Int8le] -> ShowS) -> Show Int8le
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Int8le] -> ShowS
$cshowList :: [Int8le] -> ShowS
show :: Int8le -> String
$cshow :: Int8le -> String
showsPrec :: Int -> Int8le -> ShowS
$cshowsPrec :: Int -> Int8le -> ShowS
Show)

$(deriveJson ''Int8le)