{-# LANGUAGE GADTs #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Data.Type.Coercion () where
import Data.Type.Coercion (Coercion)
import TextShow.Classes (TextShow1(..))
import TextShow.TH.Internal (deriveTextShow, deriveTextShow2, makeLiftShowbPrec)
$(deriveTextShow ''Coercion)
instance TextShow1 (Coercion a) where
liftShowbPrec :: (Int -> a -> Builder)
-> ([a] -> Builder) -> Int -> Coercion a a -> Builder
liftShowbPrec = $(makeLiftShowbPrec ''Coercion)
$(deriveTextShow2 ''Coercion)