{-# LANGUAGE TemplateHaskell #-}

module Rattletrap.Type.AttributeMapping
  ( AttributeMapping(..)
  )
where

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

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

$(deriveJson ''AttributeMapping)