用`Proxy s`绑定类型与用forall绑定类型

时间:2018-12-13 19:52:21

标签: haskell type-level-computation

在以下示例中,我不清楚为什么toto会失败,而tata会起作用。

对此有什么解释吗?

{-# LANGUAGE AllowAmbiguousTypes  #-}
{-# LANGUAGE  TypeFamilies, KindSignatures, FlexibleContexts #-}
{-# LANGUAGE TypeApplications, FunctionalDependencies, MultiParamTypeClasses #-}
{-# LANGUAGE ScopedTypeVariables , GADTs, MultiParamTypeClasses, RankNTypes                #-}
{-# LANGUAGE TypeOperators, UnicodeSyntax, DataKinds              #-}

import Data.Proxy

data KNat where
class ReflectNum (s :: KNat) where

toto ∷ (∀ (s :: KNat). ReflectNum s ⇒ Int) → Int
toto k = toto k

tata ∷ (∀ (s :: KNat). ReflectNum s ⇒ Proxy s -> Int) → Int
tata k = tata (\(p :: Proxy s) -> k p)

错误所在

SO.hs:14:15: error:
    • Could not deduce (ReflectNum s0) arising from a use of ‘k’
      from the context: ReflectNum s
        bound by a type expected by the context:
                   forall (s :: KNat). ReflectNum s => Int
        at SO.hs:14:10-15
      The type variable ‘s0’ is ambiguous
    • In the first argument of ‘toto’, namely ‘k’
      In the expression: toto k
      In an equation for ‘toto’: toto k = toto k
   |
14 | toto k = toto k
   |               ^

1 个答案:

答案 0 :(得分:3)

这是GHC实施可见类型应用程序的已知限制。具体来说,有时Proxy仍然是必需的,以便允许更高级别的函数(例如您的toto函数)的参数访问类型变量。

有一个GHC建议以type variable bindings in lambda-expressions的形式添加此问题的解决方案。使用提案中的语法,您的toto函数可以写为

toto k = toto (\@s -> k @s)

以本地绑定s变量。遗憾的是,该建议尚未实施。

同时,对于像这样的高级函数,我认为您只需要使用Proxy。抱歉。

相关问题