-- | Printer combinators for handling comments.
module HIndent.Pretty.Combinators.Comment
  ( eolCommentsArePrinted
  ) where

import Control.Monad.State
import HIndent.Printer

-- | Claims that comments were printed. Next time calling 'string' will
-- print a newline before printing a text.
eolCommentsArePrinted :: Printer ()
eolCommentsArePrinted :: Printer ()
eolCommentsArePrinted = (PrintState -> PrintState) -> Printer ()
forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify (\PrintState
s -> PrintState
s {psEolComment = True})