-- | Sequential imperative code.
module Futhark.CodeGen.ImpCode.Sequential
  ( Program,
    Sequential,
    module Futhark.CodeGen.ImpCode,
  )
where

import Futhark.CodeGen.ImpCode
import Futhark.Util.Pretty

-- | An imperative program.
type Program = Definitions Sequential

-- | Phantom type for identifying sequential imperative code.
data Sequential

instance Pretty Sequential where
  pretty :: forall ann. Sequential -> Doc ann
pretty Sequential
_ = forall a. Monoid a => a
mempty

instance FreeIn Sequential where
  freeIn' :: Sequential -> FV
freeIn' Sequential
_ = forall a. Monoid a => a
mempty