module Rattletrap.Type.AttributeType where

data AttributeType
  = AppliedDamage
  | Boolean
  | Byte
  | CamSettings
  | ClubColors
  | CustomDemolish
  | DamageState
  | Demolish
  | Enum
  | Explosion
  | ExtendedExplosion
  | FlaggedInt
  | FlaggedByte
  | Float
  | GameMode
  | GameServer
  | Int
  | Int64
  | Loadout
  | LoadoutOnline
  | Loadouts
  | LoadoutsOnline
  | Location
  | MusicStinger
  | PartyLeader
  | Pickup
  | PickupInfo
  | PickupNew
  | PlayerHistoryKey
  | PrivateMatchSettings
  | QWord
  | RepStatTitle
  | Reservation
  | RigidBodyState
  | Rotation
  | StatEvent
  | String
  | TeamPaint
  | Title
  | UniqueId
  | WeldedInfo
  deriving (AttributeType -> AttributeType -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AttributeType -> AttributeType -> Bool
$c/= :: AttributeType -> AttributeType -> Bool
== :: AttributeType -> AttributeType -> Bool
$c== :: AttributeType -> AttributeType -> Bool
Eq, Int -> AttributeType -> ShowS
[AttributeType] -> ShowS
AttributeType -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AttributeType] -> ShowS
$cshowList :: [AttributeType] -> ShowS
show :: AttributeType -> String
$cshow :: AttributeType -> String
showsPrec :: Int -> AttributeType -> ShowS
$cshowsPrec :: Int -> AttributeType -> ShowS
Show)