module Rattletrap.Decode.StringAttribute
  ( decodeStringAttributeBits
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Str
import Rattletrap.Type.StringAttribute

decodeStringAttributeBits :: DecodeBits StringAttribute
decodeStringAttributeBits :: DecodeBits StringAttribute
decodeStringAttributeBits = Str -> StringAttribute
StringAttribute (Str -> StringAttribute)
-> BitGet Str -> DecodeBits StringAttribute
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> BitGet Str
decodeStrBits