module Rattletrap.Decode.MusicStingerAttribute
  ( decodeMusicStingerAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Word32le
import Rattletrap.Decode.Word8le
import Rattletrap.Type.MusicStingerAttribute

decodeMusicStingerAttributeBits :: DecodeBits MusicStingerAttribute
decodeMusicStingerAttributeBits :: DecodeBits MusicStingerAttribute
decodeMusicStingerAttributeBits =
  Bool -> Word32le -> Word8le -> MusicStingerAttribute
MusicStingerAttribute
    (Bool -> Word32le -> Word8le -> MusicStingerAttribute)
-> BitGet Bool
-> BitGet (Word32le -> Word8le -> MusicStingerAttribute)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> BitGet Bool
getBool
    BitGet (Word32le -> Word8le -> MusicStingerAttribute)
-> BitGet Word32le -> BitGet (Word8le -> MusicStingerAttribute)
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> BitGet Word32le
decodeWord32leBits
    BitGet (Word8le -> MusicStingerAttribute)
-> BitGet Word8le -> DecodeBits MusicStingerAttribute
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> BitGet Word8le
decodeWord8leBits