module Rattletrap.Decode.StatEventAttribute
  ( decodeStatEventAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Int32le
import Rattletrap.Type.StatEventAttribute

decodeStatEventAttributeBits :: DecodeBits StatEventAttribute
decodeStatEventAttributeBits :: DecodeBits StatEventAttribute
decodeStatEventAttributeBits =
  Bool -> Int32le -> StatEventAttribute
StatEventAttribute (Bool -> Int32le -> StatEventAttribute)
-> BitGet Bool -> BitGet (Int32le -> StatEventAttribute)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> BitGet Bool
getBool BitGet (Int32le -> StatEventAttribute)
-> BitGet Int32le -> DecodeBits StatEventAttribute
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> BitGet Int32le
decodeInt32leBits