{-# LANGUAGE TemplateHaskell #-} module Rattletrap.Type.Int64Attribute ( Int64Attribute(..) ) where import Rattletrap.Type.Common import Rattletrap.Type.Int64le newtype Int64Attribute = Int64Attribute { Int64Attribute -> Int64le int64AttributeValue :: Int64le } deriving (Int64Attribute -> Int64Attribute -> Bool (Int64Attribute -> Int64Attribute -> Bool) -> (Int64Attribute -> Int64Attribute -> Bool) -> Eq Int64Attribute forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: Int64Attribute -> Int64Attribute -> Bool $c/= :: Int64Attribute -> Int64Attribute -> Bool == :: Int64Attribute -> Int64Attribute -> Bool $c== :: Int64Attribute -> Int64Attribute -> Bool Eq, Eq Int64Attribute Eq Int64Attribute -> (Int64Attribute -> Int64Attribute -> Ordering) -> (Int64Attribute -> Int64Attribute -> Bool) -> (Int64Attribute -> Int64Attribute -> Bool) -> (Int64Attribute -> Int64Attribute -> Bool) -> (Int64Attribute -> Int64Attribute -> Bool) -> (Int64Attribute -> Int64Attribute -> Int64Attribute) -> (Int64Attribute -> Int64Attribute -> Int64Attribute) -> Ord Int64Attribute Int64Attribute -> Int64Attribute -> Bool Int64Attribute -> Int64Attribute -> Ordering Int64Attribute -> Int64Attribute -> Int64Attribute 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 :: Int64Attribute -> Int64Attribute -> Int64Attribute $cmin :: Int64Attribute -> Int64Attribute -> Int64Attribute max :: Int64Attribute -> Int64Attribute -> Int64Attribute $cmax :: Int64Attribute -> Int64Attribute -> Int64Attribute >= :: Int64Attribute -> Int64Attribute -> Bool $c>= :: Int64Attribute -> Int64Attribute -> Bool > :: Int64Attribute -> Int64Attribute -> Bool $c> :: Int64Attribute -> Int64Attribute -> Bool <= :: Int64Attribute -> Int64Attribute -> Bool $c<= :: Int64Attribute -> Int64Attribute -> Bool < :: Int64Attribute -> Int64Attribute -> Bool $c< :: Int64Attribute -> Int64Attribute -> Bool compare :: Int64Attribute -> Int64Attribute -> Ordering $ccompare :: Int64Attribute -> Int64Attribute -> Ordering $cp1Ord :: Eq Int64Attribute Ord, Int -> Int64Attribute -> ShowS [Int64Attribute] -> ShowS Int64Attribute -> String (Int -> Int64Attribute -> ShowS) -> (Int64Attribute -> String) -> ([Int64Attribute] -> ShowS) -> Show Int64Attribute forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Int64Attribute] -> ShowS $cshowList :: [Int64Attribute] -> ShowS show :: Int64Attribute -> String $cshow :: Int64Attribute -> String showsPrec :: Int -> Int64Attribute -> ShowS $cshowsPrec :: Int -> Int64Attribute -> ShowS Show) $(deriveJson ''Int64Attribute)