{-# LANGUAGE CPP #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
#if __GLASGOW_HASKELL__ >= 706
{-# LANGUAGE PolyKinds #-}
#endif
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Proxy () where
import Data.Proxy.Compat (Proxy)
import TextShow.Classes (TextShow(..))
import TextShow.TH.Internal (deriveTextShow1, makeShowbPrec,
makeShowtPrec, makeShowtlPrec)
instance TextShow (Proxy s) where
showbPrec :: Int -> Proxy s -> Builder
showbPrec = $(makeShowbPrec ''Proxy)
showtPrec :: Int -> Proxy s -> Text
showtPrec = $(makeShowtPrec ''Proxy)
showtlPrec :: Int -> Proxy s -> Text
showtlPrec = $(makeShowtlPrec ''Proxy)
{-# INLINE showbPrec #-}
{-# INLINE showtPrec #-}
{-# INLINE showtlPrec #-}
$(deriveTextShow1 ''Proxy)