{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.List (showbListWith, showtListWith, showtlListWith) where
import TextShow.Classes (TextShow(..), TextShow1(..), showbListWith, showtListWith, showtlListWith)
import TextShow.Data.Char ()
import TextShow.Data.Integral ()
instance TextShow a => TextShow [a] where
{-# SPECIALIZE instance TextShow [String] #-}
{-# SPECIALIZE instance TextShow String #-}
{-# SPECIALIZE instance TextShow [Int] #-}
showb :: [a] -> Builder
showb = [a] -> Builder
forall a. TextShow a => [a] -> Builder
showbList
{-# INLINE showb #-}
instance TextShow1 [] where
liftShowbPrec :: (Int -> a -> Builder) -> ([a] -> Builder) -> Int -> [a] -> Builder
liftShowbPrec Int -> a -> Builder
_ [a] -> Builder
sl Int
_ = [a] -> Builder
sl
{-# INLINE liftShowbPrec #-}