I'm trying to derive a Typeable
instance for tupled constraints. See the following code:
{-# LANGUAGE ConstraintKinds, GADTs #-}
{-# LANGUAGE DataKinds, PolyKinds, AutoDeriveTypeable #-}
{-# LANGUAGE StandaloneDeriving, DeriveDataTypeable #-}
import Data.Proxy
import Data.Typeable
data Foo (p :: (*, *))
data Dict ctx where
Dict :: ctx => Dict ctx
deriving (Typeable)
deriving instance Typeable '(,)
deriving instance Typeable Typeable
deriving instance Typeable Show
works :: IO ()
works = print (typeRep (Proxy :: Proxy (Foo '(Bool, Char))))
alsoWorks :: IO ()
alsoWorks = print (typeRep (Dict :: Dict (Show Bool)))
fails :: IO ()
fails = print (typeRep (Dict :: Dict (Show Bool, Typeable Bool)))
main :: IO ()
main = works >> alsoWorks >> fails
If you compile this with -fprint-explicit-kinds
, the following error is given:
No instance for (Typeable
(Constraint -> Constraint -> Constraint) (,))
Is there a way to derive such an instance? Everything I try refuses to disambiguate from the ★ -> ★ -> ★
constructor.
GHC can not currently make a
Typeable
instance, or any other instance, for(,) :: Constraint -> Constraint -> Constraint
. The type constructor(,)
only has kind* -> * -> *
. There is no type constructor for products of the kindConstraint -> Constraint -> Constraint
. The constructor(,)
is overloaded to construct both tuples and products ofConstraint
s, but has no corresponding type constructor when used to make a product ofConstraint
s.If we did have a type constructor for products of
Constraint
s we should be able to define an instance as follows. For this, we'll pretend(,)
is also a type constructor with kind(,) :: Constraint -> Constraint -> Constraint
. To define an instance for it, we'd useKindSignatures
and importGHC.Exts.Constraint
to be able to talk about the kind of constraints explicitlyIf we do this now, it results in the following error, due to the kind of the
(,)
type constructor.The constraints package also works with products of constraints, and includes the following note.
I presume the hack Edward Kmett is referring to is the overloading of the
(,)
constructor forConstraint
s without a corresponding type constructor.