我们说我有这样的功能:
{-# LANGUAGE ScopedTypeVariables #-}
class C a where
foo :: forall f a b. (C (f a), C (f b)) => f a -> f b
foo = _
现在,如果我想将a
和b
的范围移到foo
类型的类型类约束的右侧(让我们说,因为我想使用foo
来实现在a
和b
中需要多态的类型类方法,可以使用Data.Constraint.Forall
进行一些小工作:
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE ConstraintKinds, TypeOperators #-}
import Data.Constraint
import Data.Constraint.Forall
foo' :: forall f. (ForallF C f) => forall a b. f a -> f b
foo' = helper
where
helper :: forall a b. f a -> f b
helper = case (instF :: ForallF C f :- C (f a)) of
Sub Dict -> case (instF :: ForallF C f :- C (f b)) of
Sub Dict -> foo
现在,我的问题是,假设我将我的功能改为涉及类型均等的东西:
{-# LANGUAGE TypeFamilies, ScopedTypeVariables #-}
type family F a :: * -> *
bar :: forall f g a b. (F (f a) ~ g a, F (f b) ~ g b) => f a -> f b
bar = _
有没有办法让上述技术适应这个?
这是我尝试的内容:
{-# LANGUAGE TypeFamilies, ScopedTypeVariables #-}
{-# LANGUAGE ConstraintKinds, TypeOperators #-}
import Data.Constraint
import Data.Constraint.Forall
type F'Eq f g x = F (f x) ~ g x
bar' :: forall f g. (Forall (F'Eq f g)) => forall a b. f a -> f b
bar' = helper
where
helper :: forall a b. f a -> f b
helper = case (inst :: Forall (F'Eq f g) :- F'Eq f g a) of
Sub Dict -> case (inst :: Forall (F'Eq f g) :- F'Eq f g b) of
Sub Dict -> bar
但是(不出所料)因为不饱和类型的同义词而失败了:
类型同义词
‘F'Eq’
应该有3个参数,但是已经给出了2个在表达式类型签名中:
Forall (F'Eq f g) :- F'Eq f g a
在表达式中:
(inst :: Forall (F'Eq f g) :- F'Eq f g a)
答案 0 :(得分:3)
您可以使用课程:
{-# LANGUAGE MultiParamTypeClasses, FlexibleInstances, FlexibleContexts #-}
class (F (f x) ~ g x) => F'Eq f g x
instance (F (f x) ~ g x) => F'Eq f g x
bar' :: forall f g. (Forall (F'Eq f g)) => forall a b. f a -> f b
bar' = helper
where
helper :: forall a b. f a -> f b
helper = case (inst :: Forall (F'Eq f g) :- F'Eq f g a) of
Sub Dict -> case (inst :: Forall (F'Eq f g) :- F'Eq f g b) of
Sub Dict -> bar