module Rattletrap.Decode.FlaggedIntAttribute
  ( decodeFlaggedIntAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Int32le
import Rattletrap.Type.FlaggedIntAttribute

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