{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}

module Utils.Display
  ( indent,
  )
where

import qualified Data.Text as Text
import PyF (fmt)

-- | indent the text given by a certain number of space character
-- If the text given contains multiple lines, all the lines but the first will be prefixed by the
-- continuation character '|'
indent :: Int -> Text.Text -> Text.Text
indent :: Int -> Text -> Text
indent Int
nbSpaces Text
text = Text
indentedText
  where
    (Text
firstLine : [Text]
nextLines) = Text -> Text -> [Text]
Text.splitOn Text
"\n" Text
text
    prefixedLines :: [Text]
prefixedLines = forall a b. (a -> b) -> [a] -> [b]
map (\Text
a -> [fmt|| {a}|]) [Text]
nextLines
    indentedLines :: [Text]
indentedLines = forall a b. (a -> b) -> [a] -> [b]
map (\Text
a -> [fmt|{replicate nbSpaces ' '}{a}|]) (Text
firstLine forall a. a -> [a] -> [a]
: [Text]
prefixedLines)
    indentedText :: Text
indentedText = Text -> [Text] -> Text
Text.intercalate Text
"\n" [Text]
indentedLines