{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Functor.Sum () where
import Data.Functor.Sum (Sum)
import TextShow.Classes (TextShow(..), TextShow1(..), showbPrec1)
import TextShow.TH.Internal (deriveTextShow1)
$(deriveTextShow1 ''Sum)
instance (TextShow1 f, TextShow1 g, TextShow a) => TextShow (Sum f g a) where
showbPrec :: Int -> Sum f g a -> Builder
showbPrec = Int -> Sum f g a -> Builder
forall (f :: * -> *) a.
(TextShow1 f, TextShow a) =>
Int -> f a -> Builder
showbPrec1
{-# INLINE showbPrec #-}