{-# LANGUAGE CPP #-}
{-# LANGUAGE TemplateHaskell #-}
#if MIN_VERSION_base(4,8,0)
{-# LANGUAGE FlexibleContexts #-}
#endif
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Monoid () where
import Data.Monoid.Compat (All, Any, Dual, First, Last, Product, Sum)
import TextShow.Data.Bool ()
import TextShow.Data.Maybe ()
import TextShow.TH.Internal (deriveTextShow, deriveTextShow1)
#if MIN_VERSION_base(4,8,0)
import Data.Monoid (Alt)
import TextShow.Classes (TextShow(..))
import TextShow.TH.Internal (makeShowbPrec)
#endif
#if MIN_VERSION_base(4,12,0)
import Data.Monoid (Ap)
#endif
$(deriveTextShow ''All)
$(deriveTextShow ''Any)
$(deriveTextShow ''Dual)
$(deriveTextShow1 ''Dual)
$(deriveTextShow ''First)
$(deriveTextShow1 ''First)
$(deriveTextShow ''Last)
$(deriveTextShow1 ''Last)
$(deriveTextShow ''Product)
$(deriveTextShow1 ''Product)
$(deriveTextShow ''Sum)
$(deriveTextShow1 ''Sum)
#if MIN_VERSION_base(4,8,0)
instance TextShow (f a) => TextShow (Alt f a) where
showbPrec = $(makeShowbPrec ''Alt)
$(deriveTextShow1 ''Alt)
#endif
#if MIN_VERSION_base(4,12,0)
instance TextShow (f a) => TextShow (Ap f a) where
showbPrec = $(makeShowbPrec ''Ap)
$(deriveTextShow1 ''Ap)
#endif