module Rattletrap.Decode.Mark
  ( decodeMark
  )
where

import Rattletrap.Decode.Common
import Rattletrap.Decode.Str
import Rattletrap.Decode.Word32le
import Rattletrap.Type.Mark

decodeMark :: Decode Mark
decodeMark :: Decode Mark
decodeMark = Str -> Word32le -> Mark
Mark (Str -> Word32le -> Mark) -> Get Str -> Get (Word32le -> Mark)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Get Str
decodeStr Get (Word32le -> Mark) -> Get Word32le -> Decode Mark
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> Get Word32le
decodeWord32le