module Text.Show.Text.Data.Semigroup (
showbMinPrecWith
, showbMaxPrecWith
, showbFirstPrecWith
, showbLastPrecWith
, showbWrappedMonoidPrecWith
, showbOptionPrecWith
, showbArgPrecWith2
) where
import Data.Semigroup (Min, Max, First, Last, WrappedMonoid, Option, Arg)
import Prelude hiding (Show)
import Text.Show.Text (Builder, showbPrecWith, showbPrecWith2)
import Text.Show.Text.TH (deriveShow, deriveShow1, deriveShow2)
#include "inline.h"
showbMinPrecWith :: (Int -> a -> Builder) -> Int -> Min a -> Builder
showbMinPrecWith = showbPrecWith
showbMaxPrecWith :: (Int -> a -> Builder) -> Int -> Max a -> Builder
showbMaxPrecWith = showbPrecWith
showbFirstPrecWith :: (Int -> a -> Builder) -> Int -> First a -> Builder
showbFirstPrecWith = showbPrecWith
showbLastPrecWith :: (Int -> a -> Builder) -> Int -> Last a -> Builder
showbLastPrecWith = showbPrecWith
showbWrappedMonoidPrecWith :: (Int -> m -> Builder) -> Int -> WrappedMonoid m -> Builder
showbWrappedMonoidPrecWith = showbPrecWith
showbOptionPrecWith :: (Int -> a -> Builder) -> Int -> Option a -> Builder
showbOptionPrecWith = showbPrecWith
showbArgPrecWith2 :: (Int -> a -> Builder) -> (Int -> b -> Builder)
-> Int -> Arg a b -> Builder
showbArgPrecWith2 = showbPrecWith2
$(deriveShow ''Min)
$(deriveShow1 ''Min)
$(deriveShow ''Max)
$(deriveShow1 ''Max)
$(deriveShow ''First)
$(deriveShow1 ''First)
$(deriveShow ''Last)
$(deriveShow1 ''Last)
$(deriveShow ''WrappedMonoid)
$(deriveShow1 ''WrappedMonoid)
$(deriveShow ''Option)
$(deriveShow1 ''Option)
$(deriveShow ''Arg)
$(deriveShow1 ''Arg)
$(deriveShow2 ''Arg)