module Rattletrap.Decode.AttributeMapping
  ( decodeAttributeMapping
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Word32le
import Rattletrap.Type.AttributeMapping

decodeAttributeMapping :: Decode AttributeMapping
decodeAttributeMapping :: Decode AttributeMapping
decodeAttributeMapping =
  Word32le -> Word32le -> AttributeMapping
AttributeMapping (Word32le -> Word32le -> AttributeMapping)
-> Get Word32le -> Get (Word32le -> AttributeMapping)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Get Word32le
decodeWord32le Get (Word32le -> AttributeMapping)
-> Get Word32le -> Decode AttributeMapping
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Get Word32le
decodeWord32le