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