{-# LANGUAGE CPP             #-}
#if MIN_VERSION_base(4,7,0)
{-# LANGUAGE GADTs           #-}
{-# LANGUAGE PolyKinds       #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
#endif
module TextShow.Data.Type.Coercion () where
#if MIN_VERSION_base(4,7,0)
import Data.Type.Coercion (Coercion)
import TextShow.Classes (TextShow1(..))
import TextShow.TH.Internal (deriveTextShow, deriveTextShow2, makeLiftShowbPrec)
$(deriveTextShow ''Coercion)
instance TextShow1 (Coercion a) where
    liftShowbPrec = $(makeLiftShowbPrec ''Coercion)
$(deriveTextShow2 ''Coercion)
#endif