{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Data () where
import Data.Data (Constr, ConstrRep, DataRep, DataType, Fixity, showConstr)
import Data.Text.Lazy.Builder (fromString)
import TextShow.Classes (TextShow(..))
import TextShow.Data.List ()
import TextShow.Data.Ratio ()
import TextShow.TH.Internal (deriveTextShow)
instance TextShow Constr where
showb :: Constr -> Builder
showb = String -> Builder
fromString (String -> Builder) -> (Constr -> String) -> Constr -> Builder
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Constr -> String
showConstr
{-# INLINE showb #-}
$(deriveTextShow ''DataRep)
$(deriveTextShow ''DataType)
$(deriveTextShow ''ConstrRep)
$(deriveTextShow ''Fixity)