{-# LANGUAGE Haskell2010
    , ScopedTypeVariables
    , TypeOperators
 #-}

module Data.Name (
    (:&),
    module Data.Name.Internal.Names
) where


import Data.Name.Internal.Names
import Data.Name.Internal.TH


instance (Show a, Show b) => Show (a :& b) where
    show _ = let showA = show :: a -> String
                 showB = show :: b -> String
             in showA undefined ++ showB undefined