{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RankNTypes #-}

-- | In most cases import "Ormolu.Printer.Combinators" instead, these
-- functions are the low-level building blocks and should not be used on
-- their own. The 'R' monad is re-exported from "Ormolu.Printer.Combinators"
-- as well.
module Ormolu.Printer.Internal
  ( -- * The 'R' monad
    R,
    runR,

    -- * Internal functions
    txt,
    interferingTxt,
    atom,
    space,
    newline,
    declNewline,
    askSourceType,
    askFixityOverrides,
    askFixityMap,
    inci,
    inciBy,
    inciByFrac,
    inciHalf,
    inciByExact,
    sitcc,
    sitccIfTrailing,
    Layout (..),
    enterLayout,
    vlayout,
    getLayout,
    getPrinterOpt,

    -- * Helpers for braces
    useBraces,
    dontUseBraces,
    canUseBraces,

    -- * Special helpers for comment placement
    CommentPosition (..),
    registerPendingCommentLine,
    trimSpanStream,
    nextEltSpan,
    popComment,
    getEnclosingSpan,
    withEnclosingSpan,
    thisLineSpans,

    -- * Stateful markers
    SpanMark (..),
    spanMarkSpan,
    HaddockStyle (..),
    setSpanMark,
    getSpanMark,

    -- * Extensions
    isExtensionEnabled,
    PrevTypeCtx (..),
    getPrevTypeCtx,
    setPrevTypeCtx,
  )
where

import Control.Monad.Reader
import Control.Monad.State.Strict
import Data.Bool (bool)
import Data.Coerce
import Data.Functor.Identity (runIdentity)
import Data.Maybe (listToMaybe)
import Data.Text (Text)
import qualified Data.Text as T
import qualified Data.Text.Lazy as TL
import Data.Text.Lazy.Builder
import GHC.Data.EnumSet (EnumSet)
import qualified GHC.Data.EnumSet as EnumSet
import GHC.LanguageExtensions.Type
import GHC.Types.SrcLoc
import GHC.Utils.Outputable (Outputable)
import Ormolu.Config
import Ormolu.Fixity (FixityMap, LazyFixityMap)
import Ormolu.Parser.CommentStream
import Ormolu.Printer.SpanStream
import Ormolu.Utils (showOutputable)

----------------------------------------------------------------------------
-- The 'R' monad

-- | The 'R' monad hosts combinators that allow us to describe how to render
-- AST.
newtype R a = R (ReaderT RC (State SC) a)
  deriving (forall a b. a -> R b -> R a
forall a b. (a -> b) -> R a -> R b
forall (f :: * -> *).
(forall a b. (a -> b) -> f a -> f b)
-> (forall a b. a -> f b -> f a) -> Functor f
<$ :: forall a b. a -> R b -> R a
$c<$ :: forall a b. a -> R b -> R a
fmap :: forall a b. (a -> b) -> R a -> R b
$cfmap :: forall a b. (a -> b) -> R a -> R b
Functor, Functor R
forall a. a -> R a
forall a b. R a -> R b -> R a
forall a b. R a -> R b -> R b
forall a b. R (a -> b) -> R a -> R b
forall a b c. (a -> b -> c) -> R a -> R b -> R c
forall (f :: * -> *).
Functor f
-> (forall a. a -> f a)
-> (forall a b. f (a -> b) -> f a -> f b)
-> (forall a b c. (a -> b -> c) -> f a -> f b -> f c)
-> (forall a b. f a -> f b -> f b)
-> (forall a b. f a -> f b -> f a)
-> Applicative f
<* :: forall a b. R a -> R b -> R a
$c<* :: forall a b. R a -> R b -> R a
*> :: forall a b. R a -> R b -> R b
$c*> :: forall a b. R a -> R b -> R b
liftA2 :: forall a b c. (a -> b -> c) -> R a -> R b -> R c
$cliftA2 :: forall a b c. (a -> b -> c) -> R a -> R b -> R c
<*> :: forall a b. R (a -> b) -> R a -> R b
$c<*> :: forall a b. R (a -> b) -> R a -> R b
pure :: forall a. a -> R a
$cpure :: forall a. a -> R a
Applicative, Applicative R
forall a. a -> R a
forall a b. R a -> R b -> R b
forall a b. R a -> (a -> R b) -> R b
forall (m :: * -> *).
Applicative m
-> (forall a b. m a -> (a -> m b) -> m b)
-> (forall a b. m a -> m b -> m b)
-> (forall a. a -> m a)
-> Monad m
return :: forall a. a -> R a
$creturn :: forall a. a -> R a
>> :: forall a b. R a -> R b -> R b
$c>> :: forall a b. R a -> R b -> R b
>>= :: forall a b. R a -> (a -> R b) -> R b
$c>>= :: forall a b. R a -> (a -> R b) -> R b
Monad)

-- | Reader context of 'R'. This should be used when we control rendering by
-- enclosing certain expressions with wrappers.
data RC = RC
  { -- | Indentation level, as the column index we need to start from after
    -- a newline if we break lines
    RC -> Int
rcIndent :: !Int,
    -- | Current layout
    RC -> Layout
rcLayout :: Layout,
    -- | Spans of enclosing elements of AST
    RC -> [RealSrcSpan]
rcEnclosingSpans :: [RealSrcSpan],
    -- | Whether the last expression in the layout can use braces
    RC -> Bool
rcCanUseBraces :: Bool,
    RC -> PrinterOptsTotal
rcPrinterOpts :: PrinterOptsTotal,
    -- | Enabled extensions
    RC -> EnumSet Extension
rcExtensions :: EnumSet Extension,
    -- | Whether the source is a signature or a regular module
    RC -> SourceType
rcSourceType :: SourceType,
    -- | Fixity map overrides, kept separately because if we parametrized
    -- 'Ormolu.Fixity.buildFixityMap' by fixity overrides it would break
    -- memoization
    RC -> FixityMap
rcFixityOverrides :: FixityMap,
    -- | Fixity map for operators
    RC -> LazyFixityMap
rcFixityMap :: LazyFixityMap
  }

-- | State context of 'R'.
data SC = SC
  { -- | Index of the next column to render
    SC -> Int
scColumn :: !Int,
    -- | Indentation level that was used for the current line
    SC -> Int
scIndent :: !Int,
    -- | Rendered source code so far
    SC -> Builder
scBuilder :: Builder,
    -- | Span stream
    SC -> SpanStream
scSpanStream :: SpanStream,
    -- | Spans of atoms that have been printed on the current line so far
    SC -> [RealSrcSpan]
scThisLineSpans :: [RealSrcSpan],
    -- | Comment stream
    SC -> CommentStream
scCommentStream :: CommentStream,
    -- | Pending comment lines (in reverse order) to be inserted before next
    -- newline, 'Int' is the indentation level
    SC -> [(CommentPosition, Text)]
scPendingComments :: ![(CommentPosition, Text)],
    -- | Whether to output a space before the next output
    SC -> RequestedDelimiter
scRequestedDelimiter :: !RequestedDelimiter,
    -- | An auxiliary marker for keeping track of last output element
    SC -> Maybe SpanMark
scSpanMark :: !(Maybe SpanMark),
    -- | What (if any) precedes the current type on the same line
    SC -> PrevTypeCtx
scPrevTypeCtx :: PrevTypeCtx
  }

-- | Make sure next output is delimited by one of the following.
data RequestedDelimiter
  = -- | A space
    RequestedSpace
  | -- | A newline
    RequestedNewline
  | -- | Nothing
    RequestedNothing
  | -- | We just output a newline
    AfterNewline
  | -- | We haven't printed anything yet
    VeryBeginning
  deriving (RequestedDelimiter -> RequestedDelimiter -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RequestedDelimiter -> RequestedDelimiter -> Bool
$c/= :: RequestedDelimiter -> RequestedDelimiter -> Bool
== :: RequestedDelimiter -> RequestedDelimiter -> Bool
$c== :: RequestedDelimiter -> RequestedDelimiter -> Bool
Eq, Int -> RequestedDelimiter -> ShowS
[RequestedDelimiter] -> ShowS
RequestedDelimiter -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [RequestedDelimiter] -> ShowS
$cshowList :: [RequestedDelimiter] -> ShowS
show :: RequestedDelimiter -> String
$cshow :: RequestedDelimiter -> String
showsPrec :: Int -> RequestedDelimiter -> ShowS
$cshowsPrec :: Int -> RequestedDelimiter -> ShowS
Show)

-- | 'Layout' options.
data Layout
  = -- | Put everything on single line
    SingleLine
  | -- | Use multiple lines
    MultiLine
  deriving (Layout -> Layout -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Layout -> Layout -> Bool
$c/= :: Layout -> Layout -> Bool
== :: Layout -> Layout -> Bool
$c== :: Layout -> Layout -> Bool
Eq, Int -> Layout -> ShowS
[Layout] -> ShowS
Layout -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Layout] -> ShowS
$cshowList :: [Layout] -> ShowS
show :: Layout -> String
$cshow :: Layout -> String
showsPrec :: Int -> Layout -> ShowS
$cshowsPrec :: Int -> Layout -> ShowS
Show)

-- | Modes for rendering of pending comments.
data CommentPosition
  = -- | Put the comment on the same line
    OnTheSameLine
  | -- | Put the comment on next line
    OnNextLine
  deriving (CommentPosition -> CommentPosition -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CommentPosition -> CommentPosition -> Bool
$c/= :: CommentPosition -> CommentPosition -> Bool
== :: CommentPosition -> CommentPosition -> Bool
$c== :: CommentPosition -> CommentPosition -> Bool
Eq, Int -> CommentPosition -> ShowS
[CommentPosition] -> ShowS
CommentPosition -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CommentPosition] -> ShowS
$cshowList :: [CommentPosition] -> ShowS
show :: CommentPosition -> String
$cshow :: CommentPosition -> String
showsPrec :: Int -> CommentPosition -> ShowS
$cshowsPrec :: Int -> CommentPosition -> ShowS
Show)

-- | Run 'R' monad.
runR ::
  -- | Monad to run
  R () ->
  -- | Span stream
  SpanStream ->
  -- | Comment stream
  CommentStream ->
  PrinterOptsTotal ->
  -- | Whether the source is a signature or a regular module
  SourceType ->
  -- | Enabled extensions
  EnumSet Extension ->
  -- | Fixity overrides
  FixityMap ->
  -- | Fixity map
  LazyFixityMap ->
  -- | Resulting rendition
  Text
runR :: R ()
-> SpanStream
-> CommentStream
-> PrinterOptsTotal
-> SourceType
-> EnumSet Extension
-> FixityMap
-> LazyFixityMap
-> Text
runR (R ReaderT RC (State SC) ()
m) SpanStream
sstream CommentStream
cstream PrinterOptsTotal
printerOpts SourceType
sourceType EnumSet Extension
extensions FixityMap
fixityOverrides LazyFixityMap
fixityMap =
  Text -> Text
TL.toStrict forall b c a. (b -> c) -> (a -> b) -> a -> c
. Builder -> Text
toLazyText forall b c a. (b -> c) -> (a -> b) -> a -> c
. SC -> Builder
scBuilder forall a b. (a -> b) -> a -> b
$ forall s a. State s a -> s -> s
execState (forall r (m :: * -> *) a. ReaderT r m a -> r -> m a
runReaderT ReaderT RC (State SC) ()
m RC
rc) SC
sc
  where
    rc :: RC
rc =
      RC
        { rcIndent :: Int
rcIndent = Int
0,
          rcLayout :: Layout
rcLayout = Layout
MultiLine,
          rcEnclosingSpans :: [RealSrcSpan]
rcEnclosingSpans = [],
          rcCanUseBraces :: Bool
rcCanUseBraces = Bool
False,
          rcPrinterOpts :: PrinterOptsTotal
rcPrinterOpts = PrinterOptsTotal
printerOpts,
          rcExtensions :: EnumSet Extension
rcExtensions = EnumSet Extension
extensions,
          rcSourceType :: SourceType
rcSourceType = SourceType
sourceType,
          rcFixityOverrides :: FixityMap
rcFixityOverrides = FixityMap
fixityOverrides,
          rcFixityMap :: LazyFixityMap
rcFixityMap = LazyFixityMap
fixityMap
        }
    sc :: SC
sc =
      SC
        { scColumn :: Int
scColumn = Int
0,
          scIndent :: Int
scIndent = Int
0,
          scBuilder :: Builder
scBuilder = forall a. Monoid a => a
mempty,
          scSpanStream :: SpanStream
scSpanStream = SpanStream
sstream,
          scThisLineSpans :: [RealSrcSpan]
scThisLineSpans = [],
          scCommentStream :: CommentStream
scCommentStream = CommentStream
cstream,
          scPendingComments :: [(CommentPosition, Text)]
scPendingComments = [],
          scRequestedDelimiter :: RequestedDelimiter
scRequestedDelimiter = RequestedDelimiter
VeryBeginning,
          scSpanMark :: Maybe SpanMark
scSpanMark = forall a. Maybe a
Nothing,
          scPrevTypeCtx :: PrevTypeCtx
scPrevTypeCtx = PrevTypeCtx
TypeCtxStart
        }

----------------------------------------------------------------------------
-- Internal functions

-- | Type of the thing to output. Influences the primary low-level rendering
-- function 'spit'.
data SpitType
  = -- | Simple opaque text that breaks comment series.
    SimpleText
  | -- | Like 'SimpleText', but assume that when this text is inserted it
    -- will separate an 'Atom' and its pending comments, so insert an extra
    -- 'newline' in that case to force the pending comments and continue on
    -- a fresh line.
    InterferingText
  | -- | An atom that typically have span information in the AST and can
    -- have comments attached to it.
    Atom
  | -- | Used for rendering comment lines.
    CommentPart
  deriving (Int -> SpitType -> ShowS
[SpitType] -> ShowS
SpitType -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SpitType] -> ShowS
$cshowList :: [SpitType] -> ShowS
show :: SpitType -> String
$cshow :: SpitType -> String
showsPrec :: Int -> SpitType -> ShowS
$cshowsPrec :: Int -> SpitType -> ShowS
Show, SpitType -> SpitType -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: SpitType -> SpitType -> Bool
$c/= :: SpitType -> SpitType -> Bool
== :: SpitType -> SpitType -> Bool
$c== :: SpitType -> SpitType -> Bool
Eq)

-- | Output a fixed 'Text' fragment. The argument may not contain any line
-- breaks. 'txt' is used to output all sorts of “fixed” bits of syntax like
-- keywords and pipes @|@ in functional dependencies.
--
-- To separate various bits of syntax with white space use 'space' instead
-- of @'txt' " "@. To output 'Outputable' Haskell entities like numbers use
-- 'atom'.
txt ::
  -- | 'Text' to output
  Text ->
  R ()
txt :: Text -> R ()
txt = SpitType -> Text -> R ()
spit SpitType
SimpleText

-- | Similar to 'txt' but the text inserted this way is assumed to break the
-- “link” between the preceding atom and its pending comments.
interferingTxt ::
  -- | 'Text' to output
  Text ->
  R ()
interferingTxt :: Text -> R ()
interferingTxt = SpitType -> Text -> R ()
spit SpitType
InterferingText

-- | Output 'Outputable' fragment of AST. This can be used to output numeric
-- literals and similar. Everything that doesn't have inner structure but
-- does have an 'Outputable' instance.
atom ::
  Outputable a =>
  a ->
  R ()
atom :: forall a. Outputable a => a -> R ()
atom = SpitType -> Text -> R ()
spit SpitType
Atom forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
T.pack forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall o. Outputable o => o -> String
showOutputable

-- | Low-level non-public helper to define 'txt' and 'atom'.
spit ::
  -- | Type of the thing to spit
  SpitType ->
  -- | 'Text' to output
  Text ->
  R ()
spit :: SpitType -> Text -> R ()
spit SpitType
_ Text
"" = forall (m :: * -> *) a. Monad m => a -> m a
return ()
spit SpitType
stype Text
text = do
  RequestedDelimiter
requestedDel <- forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> RequestedDelimiter
scRequestedDelimiter)
  [(CommentPosition, Text)]
pendingComments <- forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> [(CommentPosition, Text)]
scPendingComments)
  forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (SpitType
stype forall a. Eq a => a -> a -> Bool
== SpitType
InterferingText Bool -> Bool -> Bool
&& Bool -> Bool
not (forall (t :: * -> *) a. Foldable t => t a -> Bool
null [(CommentPosition, Text)]
pendingComments)) R ()
newline
  case RequestedDelimiter
requestedDel of
    RequestedDelimiter
RequestedNewline -> do
      forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
        SC
sc
          { scRequestedDelimiter :: RequestedDelimiter
scRequestedDelimiter = RequestedDelimiter
RequestedNothing
          }
      case SpitType
stype of
        SpitType
CommentPart -> R ()
newlineRaw
        SpitType
_ -> R ()
newline
    RequestedDelimiter
_ -> forall (m :: * -> *) a. Monad m => a -> m a
return ()
  forall a. ReaderT RC (State SC) a -> R a
R forall a b. (a -> b) -> a -> b
$ do
    Int
i <- forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> Int
rcIndent
    Int
c <- forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> Int
scColumn
    Maybe RealSrcSpan
closestEnclosing <- forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks (forall a. [a] -> Maybe a
listToMaybe forall b c a. (b -> c) -> (a -> b) -> a -> c
. RC -> [RealSrcSpan]
rcEnclosingSpans)
    let indentedTxt :: Text
indentedTxt = Text
spaces forall a. Semigroup a => a -> a -> a
<> Text
text
        spaces :: Text
spaces = Int -> Text -> Text
T.replicate Int
spacesN Text
" "
        spacesN :: Int
spacesN =
          if Int
c forall a. Eq a => a -> a -> Bool
== Int
0
            then Int
i
            else forall a. a -> a -> Bool -> a
bool Int
0 Int
1 (RequestedDelimiter
requestedDel forall a. Eq a => a -> a -> Bool
== RequestedDelimiter
RequestedSpace)
    forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
      SC
sc
        { scBuilder :: Builder
scBuilder = SC -> Builder
scBuilder SC
sc forall a. Semigroup a => a -> a -> a
<> Text -> Builder
fromText Text
indentedTxt,
          scColumn :: Int
scColumn = SC -> Int
scColumn SC
sc forall a. Num a => a -> a -> a
+ Text -> Int
T.length Text
indentedTxt,
          scIndent :: Int
scIndent =
            if Int
c forall a. Eq a => a -> a -> Bool
== Int
0
              then Int
i
              else SC -> Int
scIndent SC
sc,
          scThisLineSpans :: [RealSrcSpan]
scThisLineSpans =
            let xs :: [RealSrcSpan]
xs = SC -> [RealSrcSpan]
scThisLineSpans SC
sc
             in case SpitType
stype of
                  SpitType
Atom -> case Maybe RealSrcSpan
closestEnclosing of
                    Maybe RealSrcSpan
Nothing -> [RealSrcSpan]
xs
                    Just RealSrcSpan
x -> RealSrcSpan
x forall a. a -> [a] -> [a]
: [RealSrcSpan]
xs
                  SpitType
_ -> [RealSrcSpan]
xs,
          scRequestedDelimiter :: RequestedDelimiter
scRequestedDelimiter = RequestedDelimiter
RequestedNothing,
          scSpanMark :: Maybe SpanMark
scSpanMark =
            -- If there are pending comments, do not reset last comment
            -- location.
            if (SpitType
stype forall a. Eq a => a -> a -> Bool
== SpitType
CommentPart) Bool -> Bool -> Bool
|| (Bool -> Bool
not forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (t :: * -> *) a. Foldable t => t a -> Bool
null forall b c a. (b -> c) -> (a -> b) -> a -> c
. SC -> [(CommentPosition, Text)]
scPendingComments) SC
sc
              then SC -> Maybe SpanMark
scSpanMark SC
sc
              else forall a. Maybe a
Nothing
        }

-- | This primitive /does not/ necessarily output a space. It just ensures
-- that the next thing that will be printed on the same line will be
-- separated by a single space from the previous output. Using this
-- combinator twice results in at most one space.
--
-- In practice this design prevents trailing white space and makes it hard
-- to output more than one delimiting space in a row, which is what we
-- usually want.
space :: R ()
space :: R ()
space = forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
  SC
sc
    { scRequestedDelimiter :: RequestedDelimiter
scRequestedDelimiter = case SC -> RequestedDelimiter
scRequestedDelimiter SC
sc of
        RequestedDelimiter
RequestedNothing -> RequestedDelimiter
RequestedSpace
        RequestedDelimiter
other -> RequestedDelimiter
other
    }

declNewline :: R ()
declNewline :: R ()
declNewline = Int -> R ()
newlineRawN forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< forall a. (forall (f :: * -> *). PrinterOpts f -> f a) -> R a
getPrinterOpt forall (f :: * -> *). PrinterOpts f -> f Int
poNewlinesBetweenDecls

-- | Output a newline. First time 'newline' is used after some non-'newline'
-- output it gets inserted immediately. Second use of 'newline' does not
-- output anything but makes sure that the next non-white space output will
-- be prefixed by a newline. Using 'newline' more than twice in a row has no
-- effect. Also, using 'newline' at the very beginning has no effect, this
-- is to avoid leading whitespace.
--
-- Similarly to 'space', this design prevents trailing newlines and makes it
-- hard to output more than one blank newline in a row.
newline :: R ()
newline :: R ()
newline = do
  Int
indent <- forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> Int
scIndent)
  [(CommentPosition, Text)]
cs <- forall a. [a] -> [a]
reverse forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> [(CommentPosition, Text)]
scPendingComments)
  case [(CommentPosition, Text)]
cs of
    [] -> R ()
newlineRaw
    ((CommentPosition
position, Text
_) : [(CommentPosition, Text)]
_) -> do
      case CommentPosition
position of
        CommentPosition
OnTheSameLine -> R ()
space
        CommentPosition
OnNextLine -> R ()
newlineRaw
      forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
t a -> (a -> m b) -> m ()
forM_ [(CommentPosition, Text)]
cs forall a b. (a -> b) -> a -> b
$ \(CommentPosition
_, Text
text) ->
        let modRC :: RC -> RC
modRC RC
rc =
              RC
rc
                { rcIndent :: Int
rcIndent = Int
indent
                }
            R ReaderT RC (State SC) ()
m = do
              forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (Text -> Bool
T.null Text
text) forall a b. (a -> b) -> a -> b
$
                SpitType -> Text -> R ()
spit SpitType
CommentPart Text
text
              R ()
newlineRaw
         in forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m
      forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
        SC
sc
          { scPendingComments :: [(CommentPosition, Text)]
scPendingComments = []
          }

-- | Low-level newline primitive. This one always just inserts a newline, no
-- hooks can be attached.
newlineRaw :: R ()
newlineRaw :: R ()
newlineRaw = Int -> R ()
newlineRawN Int
1

-- | Low-level newline primitive. This always inserts 'n' newlines.
newlineRawN :: Int -> R ()
newlineRawN :: Int -> R ()
newlineRawN Int
n = forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
  let requestedDel :: RequestedDelimiter
requestedDel = SC -> RequestedDelimiter
scRequestedDelimiter SC
sc
      builderSoFar :: Builder
builderSoFar = SC -> Builder
scBuilder SC
sc
      n' :: Int
n' = case RequestedDelimiter
requestedDel of
        RequestedDelimiter
AfterNewline -> Int
n forall a. Num a => a -> a -> a
- Int
1
        RequestedDelimiter
RequestedNewline -> Int
n forall a. Num a => a -> a -> a
- Int
1
        RequestedDelimiter
VeryBeginning -> Int
n forall a. Num a => a -> a -> a
- Int
1
        RequestedDelimiter
_ -> Int
n
   in SC
sc
        { scBuilder :: Builder
scBuilder = Builder
builderSoFar forall a. Semigroup a => a -> a -> a
<> forall a. Monoid a => [a] -> a
mconcat (forall a. Int -> a -> [a]
replicate Int
n' Builder
"\n"),
          scColumn :: Int
scColumn = Int
0,
          scIndent :: Int
scIndent = Int
0,
          scThisLineSpans :: [RealSrcSpan]
scThisLineSpans = [],
          scRequestedDelimiter :: RequestedDelimiter
scRequestedDelimiter = case SC -> RequestedDelimiter
scRequestedDelimiter SC
sc of
            RequestedDelimiter
AfterNewline -> RequestedDelimiter
RequestedNewline
            RequestedDelimiter
RequestedNewline -> RequestedDelimiter
RequestedNewline
            RequestedDelimiter
VeryBeginning -> RequestedDelimiter
VeryBeginning
            RequestedDelimiter
_ -> RequestedDelimiter
AfterNewline
        }

-- | Return the source type.
askSourceType :: R SourceType
askSourceType :: R SourceType
askSourceType = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> SourceType
rcSourceType)

-- | Retrieve fixity overrides map.
askFixityOverrides :: R FixityMap
askFixityOverrides :: R FixityMap
askFixityOverrides = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> FixityMap
rcFixityOverrides)

-- | Retrieve the lazy fixity map.
askFixityMap :: R LazyFixityMap
askFixityMap :: R LazyFixityMap
askFixityMap = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> LazyFixityMap
rcFixityMap)

-- | Like 'inci', but indents by exactly the given number of steps.
inciBy :: Int -> R () -> R ()
inciBy :: Int -> R () -> R ()
inciBy Int
step (R ReaderT RC (State SC) ()
m) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m)
  where
    modRC :: RC -> RC
modRC RC
rc =
      RC
rc
        { rcIndent :: Int
rcIndent = forall {a}. Integral a => a -> a -> a
roundDownToNearest Int
step (RC -> Int
rcIndent RC
rc) forall a. Num a => a -> a -> a
+ Int
step
        }
    roundDownToNearest :: a -> a -> a
roundDownToNearest a
r a
n = (a
n forall {a}. Integral a => a -> a -> a
`div` a
r) forall a. Num a => a -> a -> a
* a
r

-- | Like 'inci', but indents by the given fraction of a full step.
inciByFrac :: Int -> R () -> R ()
inciByFrac :: Int -> R () -> R ()
inciByFrac Int
x R ()
m = do
  Int
indentStep <- forall a. (forall (f :: * -> *). PrinterOpts f -> f a) -> R a
getPrinterOpt forall (f :: * -> *). PrinterOpts f -> f Int
poIndentation
  let step :: Int
step = Int
indentStep forall {a}. Integral a => a -> a -> a
`quot` Int
x
  Int -> R () -> R ()
inciBy Int
step R ()
m

-- | Increase indentation level by one indentation step for the inner
-- computation. 'inci' should be used when a part of code must be more
-- indented relative to the parts outside of 'inci' in order for the output
-- to be valid Haskell. When layout is single-line there is no obvious
-- effect, but with multi-line layout correct indentation levels matter.
inci :: R () -> R ()
inci :: R () -> R ()
inci = Int -> R () -> R ()
inciByFrac Int
1

-- | In rare cases, we have to indent by a positive amount smaller
-- than 'indentStep'.
inciHalf :: R () -> R ()
inciHalf :: R () -> R ()
inciHalf = Int -> R () -> R ()
inciByFrac Int
2

-- | Like 'inci', but indents by exactly the given number of spaces.
inciByExact :: Int -> R () -> R ()
inciByExact :: Int -> R () -> R ()
inciByExact Int
spaces (R ReaderT RC (State SC) ()
m) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m)
  where
    modRC :: RC -> RC
modRC RC
rc =
      RC
rc
        { rcIndent :: Int
rcIndent = RC -> Int
rcIndent RC
rc forall a. Num a => a -> a -> a
+ Int
spaces
        }

-- | Set indentation level for the inner computation equal to current
-- column. This makes sure that the entire inner block is uniformly
-- \"shifted\" to the right.
sitcc :: R () -> R ()
sitcc :: R () -> R ()
sitcc (R ReaderT RC (State SC) ()
m) = do
  RequestedDelimiter
requestedDel <- forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> RequestedDelimiter
scRequestedDelimiter)
  Int
i <- forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> Int
rcIndent)
  Int
c <- forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> Int
scColumn)
  let modRC :: RC -> RC
modRC RC
rc =
        RC
rc
          { rcIndent :: Int
rcIndent = forall a. Ord a => a -> a -> a
max Int
i (Int
c forall a. Num a => a -> a -> a
+ forall a. a -> a -> Bool -> a
bool Int
0 Int
1 (RequestedDelimiter
requestedDel forall a. Eq a => a -> a -> Bool
== RequestedDelimiter
RequestedSpace))
          }
  forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m)

-- | When using trailing commas, same as 'sitcc'; when using leading commas,
-- runs the input action unmodified.
sitccIfTrailing :: R () -> R ()
sitccIfTrailing :: R () -> R ()
sitccIfTrailing R ()
x =
  forall a. (forall (f :: * -> *). PrinterOpts f -> f a) -> R a
getPrinterOpt forall (f :: * -> *). PrinterOpts f -> f CommaStyle
poCommaStyle forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= \case
    CommaStyle
Leading -> forall a. a -> a
id R ()
x
    CommaStyle
Trailing -> R () -> R ()
sitcc R ()
x

-- | Set 'Layout' for internal computation.
enterLayout :: Layout -> R () -> R ()
enterLayout :: Layout -> R () -> R ()
enterLayout Layout
l (R ReaderT RC (State SC) ()
m) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m)
  where
    modRC :: RC -> RC
modRC RC
rc =
      RC
rc
        { rcLayout :: Layout
rcLayout = Layout
l
        }

-- | Do one or another thing depending on current 'Layout'.
vlayout ::
  -- | Single line
  R a ->
  -- | Multi line
  R a ->
  R a
vlayout :: forall a. R a -> R a -> R a
vlayout R a
sline R a
mline = do
  Layout
l <- R Layout
getLayout
  case Layout
l of
    Layout
SingleLine -> R a
sline
    Layout
MultiLine -> R a
mline

-- | Get current 'Layout'.
getLayout :: R Layout
getLayout :: R Layout
getLayout = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> Layout
rcLayout)

-- | Get a particular 'PrinterOpts' field from the environment.
getPrinterOpt :: (forall f. PrinterOpts f -> f a) -> R a
getPrinterOpt :: forall a. (forall (f :: * -> *). PrinterOpts f -> f a) -> R a
getPrinterOpt forall (f :: * -> *). PrinterOpts f -> f a
f = forall a. ReaderT RC (State SC) a -> R a
R forall a b. (a -> b) -> a -> b
$ forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks forall a b. (a -> b) -> a -> b
$ forall a. Identity a -> a
runIdentity forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (f :: * -> *). PrinterOpts f -> f a
f forall b c a. (b -> c) -> (a -> b) -> a -> c
. RC -> PrinterOptsTotal
rcPrinterOpts

----------------------------------------------------------------------------
-- Special helpers for comment placement

-- | Register a comment line for outputting. It will be inserted right
-- before next newline. When the comment goes after something else on the
-- same line, a space will be inserted between preceding text and the
-- comment when necessary.
registerPendingCommentLine ::
  -- | Comment position
  CommentPosition ->
  -- | 'Text' to output
  Text ->
  R ()
registerPendingCommentLine :: CommentPosition -> Text -> R ()
registerPendingCommentLine CommentPosition
position Text
text = forall a. ReaderT RC (State SC) a -> R a
R forall a b. (a -> b) -> a -> b
$ do
  forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
    SC
sc
      { scPendingComments :: [(CommentPosition, Text)]
scPendingComments = (CommentPosition
position, Text
text) forall a. a -> [a] -> [a]
: SC -> [(CommentPosition, Text)]
scPendingComments SC
sc
      }

-- | Drop elements that begin before or at the same place as given
-- 'SrcSpan'.
trimSpanStream ::
  -- | Reference span
  RealSrcSpan ->
  R ()
trimSpanStream :: RealSrcSpan -> R ()
trimSpanStream RealSrcSpan
ref = do
  let leRef :: RealSrcSpan -> Bool
      leRef :: RealSrcSpan -> Bool
leRef RealSrcSpan
x = RealSrcSpan -> RealSrcLoc
realSrcSpanStart RealSrcSpan
x forall a. Ord a => a -> a -> Bool
<= RealSrcSpan -> RealSrcLoc
realSrcSpanStart RealSrcSpan
ref
  forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
    SC
sc
      { scSpanStream :: SpanStream
scSpanStream = coerce :: forall a b. Coercible a b => a -> b
coerce (forall a. (a -> Bool) -> [a] -> [a]
dropWhile RealSrcSpan -> Bool
leRef) (SC -> SpanStream
scSpanStream SC
sc)
      }

-- | Get location of next element in AST.
nextEltSpan :: R (Maybe RealSrcSpan)
nextEltSpan :: R (Maybe RealSrcSpan)
nextEltSpan = forall a. [a] -> Maybe a
listToMaybe forall b c a. (b -> c) -> (a -> b) -> a -> c
. coerce :: forall a b. Coercible a b => a -> b
coerce forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> SpanStream
scSpanStream)

-- | Pop a 'Comment' from the 'CommentStream' if given predicate is
-- satisfied and there are comments in the stream.
popComment ::
  (RealLocated Comment -> Bool) ->
  R (Maybe (RealLocated Comment))
popComment :: (RealLocated Comment -> Bool) -> R (Maybe (RealLocated Comment))
popComment RealLocated Comment -> Bool
f = forall a. ReaderT RC (State SC) a -> R a
R forall a b. (a -> b) -> a -> b
$ do
  CommentStream [RealLocated Comment]
cstream <- forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> CommentStream
scCommentStream
  case [RealLocated Comment]
cstream of
    [] -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing
    (RealLocated Comment
x : [RealLocated Comment]
xs) ->
      if RealLocated Comment -> Bool
f RealLocated Comment
x
        then
          forall a. a -> Maybe a
Just RealLocated Comment
x
            forall (f :: * -> *) a b. Functor f => a -> f b -> f a
<$ forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify
              ( \SC
sc ->
                  SC
sc
                    { scCommentStream :: CommentStream
scCommentStream = [RealLocated Comment] -> CommentStream
CommentStream [RealLocated Comment]
xs
                    }
              )
        else forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing

-- | Get the first enclosing 'RealSrcSpan' that satisfies given predicate.
getEnclosingSpan ::
  -- | Predicate to use
  (RealSrcSpan -> Bool) ->
  R (Maybe RealSrcSpan)
getEnclosingSpan :: (RealSrcSpan -> Bool) -> R (Maybe RealSrcSpan)
getEnclosingSpan RealSrcSpan -> Bool
f =
  forall a. [a] -> Maybe a
listToMaybe forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. (a -> Bool) -> [a] -> [a]
filter RealSrcSpan -> Bool
f forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> [RealSrcSpan]
rcEnclosingSpans)

-- | Set 'RealSrcSpan' of enclosing span for the given computation.
withEnclosingSpan :: RealSrcSpan -> R () -> R ()
withEnclosingSpan :: RealSrcSpan -> R () -> R ()
withEnclosingSpan RealSrcSpan
spn (R ReaderT RC (State SC) ()
m) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local RC -> RC
modRC ReaderT RC (State SC) ()
m)
  where
    modRC :: RC -> RC
modRC RC
rc =
      RC
rc
        { rcEnclosingSpans :: [RealSrcSpan]
rcEnclosingSpans = RealSrcSpan
spn forall a. a -> [a] -> [a]
: RC -> [RealSrcSpan]
rcEnclosingSpans RC
rc
        }

-- | Get spans on this line so far.
thisLineSpans :: R [RealSrcSpan]
thisLineSpans :: R [RealSrcSpan]
thisLineSpans = forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> [RealSrcSpan]
scThisLineSpans)

----------------------------------------------------------------------------
-- Stateful markers

-- | An auxiliary marker for keeping track of last output element.
data SpanMark
  = -- | Haddock comment
    HaddockSpan HaddockStyle RealSrcSpan
  | -- | Non-haddock comment
    CommentSpan RealSrcSpan
  | -- | A statement in a do-block and such span
    StatementSpan RealSrcSpan

-- | Project 'RealSrcSpan' from 'SpanMark'.
spanMarkSpan :: SpanMark -> RealSrcSpan
spanMarkSpan :: SpanMark -> RealSrcSpan
spanMarkSpan = \case
  HaddockSpan HaddockStyle
_ RealSrcSpan
s -> RealSrcSpan
s
  CommentSpan RealSrcSpan
s -> RealSrcSpan
s
  StatementSpan RealSrcSpan
s -> RealSrcSpan
s

-- | Haddock string style.
data HaddockStyle
  = -- | @-- |@
    Pipe
  | -- | @-- ^@
    Caret
  | -- | @-- *@
    Asterisk Int
  | -- | @-- $@
    Named String

-- | Set span of last output comment.
setSpanMark ::
  -- | Span mark to set
  SpanMark ->
  R ()
setSpanMark :: SpanMark -> R ()
setSpanMark SpanMark
spnMark = forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify forall a b. (a -> b) -> a -> b
$ \SC
sc ->
  SC
sc
    { scSpanMark :: Maybe SpanMark
scSpanMark = forall a. a -> Maybe a
Just SpanMark
spnMark
    }

-- | Get span of last output comment.
getSpanMark :: R (Maybe SpanMark)
getSpanMark :: R (Maybe SpanMark)
getSpanMark = forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> Maybe SpanMark
scSpanMark)

----------------------------------------------------------------------------
-- Helpers for braces

-- | Make the inner computation use braces around single-line layouts.
useBraces :: R () -> R ()
useBraces :: R () -> R ()
useBraces (R ReaderT RC (State SC) ()
r) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local (\RC
i -> RC
i {rcCanUseBraces :: Bool
rcCanUseBraces = Bool
True}) ReaderT RC (State SC) ()
r)

-- | Make the inner computation omit braces around single-line layouts.
dontUseBraces :: R () -> R ()
dontUseBraces :: R () -> R ()
dontUseBraces (R ReaderT RC (State SC) ()
r) = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> r) -> m a -> m a
local (\RC
i -> RC
i {rcCanUseBraces :: Bool
rcCanUseBraces = Bool
False}) ReaderT RC (State SC) ()
r)

-- | Return 'True' if we can use braces in this context.
canUseBraces :: R Bool
canUseBraces :: R Bool
canUseBraces = forall a. ReaderT RC (State SC) a -> R a
R (forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks RC -> Bool
rcCanUseBraces)

----------------------------------------------------------------------------
-- Extensions

isExtensionEnabled :: Extension -> R Bool
isExtensionEnabled :: Extension -> R Bool
isExtensionEnabled Extension
ext = forall a. ReaderT RC (State SC) a -> R a
R forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall r (m :: * -> *) a. MonadReader r m => (r -> a) -> m a
asks forall a b. (a -> b) -> a -> b
$ forall a. Enum a => a -> EnumSet a -> Bool
EnumSet.member Extension
ext forall b c a. (b -> c) -> (a -> b) -> a -> c
. RC -> EnumSet Extension
rcExtensions

----------------------------------------------------------------------------
-- Previous type context

-- | What (if anything) precedes the current type on the same line
-- Only used for the `function-arrows` setting
data PrevTypeCtx
  = TypeCtxStart
  | TypeCtxForall
  | TypeCtxContext
  | TypeCtxArgument
  deriving (PrevTypeCtx -> PrevTypeCtx -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PrevTypeCtx -> PrevTypeCtx -> Bool
$c/= :: PrevTypeCtx -> PrevTypeCtx -> Bool
== :: PrevTypeCtx -> PrevTypeCtx -> Bool
$c== :: PrevTypeCtx -> PrevTypeCtx -> Bool
Eq, Int -> PrevTypeCtx -> ShowS
[PrevTypeCtx] -> ShowS
PrevTypeCtx -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PrevTypeCtx] -> ShowS
$cshowList :: [PrevTypeCtx] -> ShowS
show :: PrevTypeCtx -> String
$cshow :: PrevTypeCtx -> String
showsPrec :: Int -> PrevTypeCtx -> ShowS
$cshowsPrec :: Int -> PrevTypeCtx -> ShowS
Show)

getPrevTypeCtx :: R PrevTypeCtx
getPrevTypeCtx :: R PrevTypeCtx
getPrevTypeCtx = forall a. ReaderT RC (State SC) a -> R a
R (forall s (m :: * -> *) a. MonadState s m => (s -> a) -> m a
gets SC -> PrevTypeCtx
scPrevTypeCtx)

setPrevTypeCtx :: PrevTypeCtx -> R ()
setPrevTypeCtx :: PrevTypeCtx -> R ()
setPrevTypeCtx PrevTypeCtx
prevTypeCtx =
  forall a. ReaderT RC (State SC) a -> R a
R forall a b. (a -> b) -> a -> b
$ forall s (m :: * -> *). MonadState s m => (s -> s) -> m ()
modify (\SC
sc -> SC
sc {scPrevTypeCtx :: PrevTypeCtx
scPrevTypeCtx = PrevTypeCtx
prevTypeCtx})