HList with DataKinds,种类不可提升

HList with DataKinds, kind not promotable

我有这个代码片段,它使用了大量的 GHC 扩展:

{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE KindSignatures #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}

import GHC.Exts (Constraint)

data HList :: [*] -> * where
    Nil  :: HList '[]
    Cons :: a -> HList l -> HList (a ': l)

type family All (p :: * -> Constraint) (xs :: HList [*]) :: Constraint where
    All p Nil = ()
    All p (Cons x xs) = (p x, All p xs)

GHC 抱怨说:

 ‘HList’ of kind ‘[*] -> *’ is not promotable
    In the kind ‘HList [*]’

为什么我无法将 HList 提升为一种类型?我使用 GHC 7.8.27.11.

得到同样的错误

当然,使用内置 '[] 就可以了:

type family All (p :: * -> Constraint) (xs :: [*]) :: Constraint where
    All p '[]       = ()
    All p (x ': xs) = (p x, All p xs)

我想使用我自己的 HList 而不是 '[] 因为实际的 HList 支持附加并且看起来像这样:

type family (:++:) (xs :: [*]) (ys :: [*]) where
    '[] :++:  ys = ys
     xs :++: '[] = xs
    (x ': xs) :++: ys = x ': (xs :++: ys)

data HList :: [*] -> * where
    Nil  :: HList '[]
    Cons :: a -> HList l -> HList (a ': l)
    App  :: Hlist a -> HList b -> HList (a :++: b)

编辑:主要目标是让 GHC 推断

(All p xs, All p ys) ==> All p (xs :++: ys)

这样我就可以写

data Dict :: Constraint -> * where
    Dict :: c => Dict c

witness :: Dict (All p xs) -> Dict (All p ys) -> Dict (All p (xs :++: ys))
witness Dict Dict = Dict

我曾希望为附加类型级列表添加显式表示可以帮助我实现这一点。还有其他方法可以让 GHC 相信以上内容吗?

我现在看到问题是如何写(All p xs, All p ys) => All p (xs :++: ys)的证明。答案当然是归纳法!

我们真正要写的函数类型是

allAppend :: (p :: Constraint) -> (xs :: [*]) -> (ys :: [*]) 
          -> (All p xs, All p ys) -> All p (xs :++: ys)

但 Haskell 没有依赖类型。 "Faking" 依赖类型通常意味着拥有一个见证类型存在的证据。这使事情变得有些乏味,但目前没有其他办法。我们已经有了列表 xs 的见证 - 它恰好是 HList xs。对于约束,我们将使用

data Dict p where Dict :: p => Dict p

那么我们可以把蕴涵写成一个简单的函数:

type (==>) a b = Dict a -> Dict b 

所以我们的类型变成:

allAppend :: Proxy p -> HList xs -> HList ys 
          -> (All p xs, All p ys) ==> (All p (xs :++: ys))

函数体非常简单 - 请注意 allAppend 中的每个模式如何匹配 :++: 定义中的每个模式:

allAppend _ Nil _  Dict = Dict  
allAppend _ _  Nil Dict = Dict 
allAppend p (Cons _ xs) ys@(Cons _ _) Dict = 
  case allAppend p xs ys Dict of Dict -> Dict 

相反的蕴涵 All p (xs :++: ys) => (All p xs, All p ys) 也成立。事实上,函数定义是相同的。