module Test.Sandwich.Formatters.Print.Types where

import Control.Monad.Logger

data PrintFormatter = PrintFormatter {
  PrintFormatter -> Bool
printFormatterUseColor :: Bool
  , PrintFormatter -> Maybe LogLevel
printFormatterLogLevel :: Maybe LogLevel
  , PrintFormatter -> Int
printFormatterVisibilityThreshold :: Int
  , PrintFormatter -> Bool
printFormatterIncludeCallStacks :: Bool
  , PrintFormatter -> Int
printFormatterIndentSize :: Int
  }

defaultPrintFormatter :: PrintFormatter
defaultPrintFormatter :: PrintFormatter
defaultPrintFormatter = PrintFormatter :: Bool -> Maybe LogLevel -> Int -> Bool -> Int -> PrintFormatter
PrintFormatter {
  printFormatterUseColor :: Bool
printFormatterUseColor = Bool
True
  , printFormatterLogLevel :: Maybe LogLevel
printFormatterLogLevel = LogLevel -> Maybe LogLevel
forall a. a -> Maybe a
Just LogLevel
LevelWarn
  , printFormatterVisibilityThreshold :: Int
printFormatterVisibilityThreshold = Int
50
  , printFormatterIncludeCallStacks :: Bool
printFormatterIncludeCallStacks = Bool
True
  , printFormatterIndentSize :: Int
printFormatterIndentSize = Int
4
  }