module Rattletrap.Decode.PlayerHistoryKeyAttribute
  ( decodePlayerHistoryKeyAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Type.PlayerHistoryKeyAttribute

decodePlayerHistoryKeyAttributeBits :: DecodeBits PlayerHistoryKeyAttribute
decodePlayerHistoryKeyAttributeBits :: DecodeBits PlayerHistoryKeyAttribute
decodePlayerHistoryKeyAttributeBits =
  Word16 -> PlayerHistoryKeyAttribute
PlayerHistoryKeyAttribute (Word16 -> PlayerHistoryKeyAttribute)
-> BitGet Word16 -> DecodeBits PlayerHistoryKeyAttribute
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Int -> BitGet Word16
forall a. Bits a => Int -> BitGet a
getBitsLE Int
14