module Rattletrap.Decode.FlaggedByteAttribute
  ( decodeFlaggedByteAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Word8le
import Rattletrap.Type.FlaggedByteAttribute


decodeFlaggedByteAttributeBits :: DecodeBits FlaggedByteAttribute
decodeFlaggedByteAttributeBits :: DecodeBits FlaggedByteAttribute
decodeFlaggedByteAttributeBits =
  Bool -> Word8le -> FlaggedByteAttribute
FlaggedByteAttribute (Bool -> Word8le -> FlaggedByteAttribute)
-> BitGet Bool -> BitGet (Word8le -> FlaggedByteAttribute)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> BitGet Bool
getBool BitGet (Word8le -> FlaggedByteAttribute)
-> BitGet Word8le -> DecodeBits FlaggedByteAttribute
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> BitGet Word8le
decodeWord8leBits