{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Ord () where
import GHC.Exts (Down(..))
import TextShow.Classes ( TextShow(..), TextShow1(..)
, showbPrec1, showbUnaryWith )
import TextShow.TH.Internal (deriveTextShow)
instance TextShow a => TextShow (Down a) where
showbPrec = showbPrec1
{-# INLINE showbPrec #-}
instance TextShow1 Down where
liftShowbPrec sp _ p (Down x) = showbUnaryWith sp "Down" p x
{-# INLINE liftShowbPrec #-}
$(deriveTextShow ''Ordering)