{-# LANGUAGE TemplateHaskell #-}

module Rattletrap.Type.PickupAttributeNew
  ( PickupAttributeNew(..)
  )
where

import Rattletrap.Type.Common
import Rattletrap.Type.Word8le
import Rattletrap.Type.Word32le

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

$(deriveJson ''PickupAttributeNew)