类型级递归和PolyKinds

时间:2018-10-10 17:48:42

标签: haskell type-level-computation polykinds

我正在尝试实现一种本质上遍历类型的多态函数,并累积一个Tag值。我希望用户能够做到rec ((1,2), ('a', 3))

{-# LANGUAGE KindSignatures, PolyKinds, FlexibleInstances #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE UndecidableInstances #-}
import Data.Proxy

newtype Tag (a :: k) = Tag Int
    deriving (Eq, Read, Show)

-- My users only have to define their own instances of this class...
class Tagged (a :: k) where
  tag :: Tag a

-- ...like these:
instance Tagged Int where
  tag = Tag 1

instance Tagged Char where
  tag = Tag 2

instance Tagged (,) where
  tag = Tag 3


-- While this is a morally "closed" class; implementing recursion over
-- components of types. This is what I'm struggling with:
class Rec (a :: k) where
  rec :: proxy a -> Tag a

instance (Rec ab, Rec c)=> Rec (ab c) where
  rec _ = let Tag ab = rec Proxy :: Tag ab
              Tag c = rec Proxy :: Tag c
           in Tag (ab * c)

instance {-# OVERLAPPABLE #-} Tagged a=> Rec a where
  rec _ = tag :: Tag a

我已经以各种方式来弄弄这个,并且在当前的化身中得到了错误(对于abc,首先是):

    • Could not deduce (Tagged ab) arising from a use of ‘rec’
      from the context: (Rec ab, Rec c)
        bound by the instance declaration at flook.hs:26:10-37
    • In the expression: rec Proxy :: Tag ab
      In a pattern binding: Tag ab = rec Proxy :: Tag ab
      In the expression:
        let
          Tag ab = rec Proxy :: Tag ab
          Tag c = rec Proxy :: Tag c
        in Tag (ab * c)
   |
27 |   rec _ = let Tag ab = rec Proxy :: Tag ab
   |                        ^^^^^^^^^

对于这个错误,我感到有些惊讶,因为它似乎表明第二个基本案例是在第一个实例的主体中被优先选择的。

是否有办法使它起作用,或者有更好的方法?

1 个答案:

答案 0 :(得分:2)

我认为您应该跳过两节课。一个就足够了。

缺点是您的用户将无法在设计中编写与instance Tagged (Maybe Int)对应的实例,这些实例对复合类型有特殊的作用...但是由于该应用程序,他们已经不能真正使用它们了Rec的实例始终会与之重叠。

因此,事不宜迟:

{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE UndecidableInstances #-}

import Data.Tagged

class Rec a where rec :: Tagged a Int

-- it is still possible for users to define their own instances for base types
instance Rec Int  where rec = 1
instance Rec Char where rec = 2
instance Rec (,)  where rec = 3

instance (Rec ab, Rec c) => Rec (ab c) where
  rec = retag (rec :: Tagged ab Int) * retag (rec :: Tagged c Int)

在ghci中:

> rec :: Tagged ((Int, Int), Char) Int
Tagged 18