处理可组合的免费DSL中的模糊类型

时间:2015-05-05 16:21:03

标签: haskell free-monad

我正在构建一些基于免费monad'而且可以组合的DSL。使用免费 compdata 包(与Combining Free types精神相似),点击数据类型和数据类型。

虽然这适用于一些简单的DSL,但我坚持使用一个带有类型参数的DSL,如果构造函数/命令不依赖于此类型参数,则会导致来自GHC的模糊类型参数错误。

澄清一下,这里有一些代码:

{-# LANGUAGE DeriveFunctor #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE TypeOperators #-}

module DSL where

import Data.Comp
import Control.Monad.Free

type Index = Int

data DSL a next = Read Index (a -> next)
                | Write a (Index -> next)
                | GetLastIndex (Index -> next)
    deriving (Functor)

read :: (Functor f, DSL a :<: f, MonadFree f m) => Index -> m a
read idx = liftF (inj (Read idx id))

write :: (Functor f, DSL a :<: f, MonadFree f m) => a -> m Index
write a = liftF (inj (Write a id))

-- This works
getLastIndex' :: MonadFree (DSL a) m => m Index
getLastIndex' = liftF (GetLastIndex id)

-- This doesn't:
--
--     Could not deduce (Data.Comp.Ops.Subsume
--                         (compdata-0.10:Data.Comp.SubsumeCommon.ComprEmb
--                            (Data.Comp.Ops.Elem (DSL a0) f))
--                         (DSL a0)
--                         f)
--     from the context (Functor f, DSL a :<: f, MonadFree f m)
--       bound by the type signature for
--                  getLastIndex :: (Functor f, DSL a :<: f, MonadFree f m) => m Index
--       at simple.hs:30:17-66
--     The type variable ‘a0’ is ambiguous
--     In the ambiguity check for the type signature for ‘getLastIndex’:
--       getLastIndex :: forall (m :: * -> *) (f :: * -> *) a.
--                       (Functor f, DSL a :<: f, MonadFree f m) =>
--                       m Index
--     To defer the ambiguity check to use sites, enable AllowAmbiguousTypes
--     In the type signature for ‘getLastIndex’:
--       getLastIndex :: (Functor f, DSL a :<: f, MonadFree f m) => m Index

getLastIndex :: (Functor f, DSL a :<: f, MonadFree f m) => m Index
-- getLastIndex = liftF (inj (GetLastIndex id))
getLastIndex = _

如GHC暗示的那样,尝试启用 AllowAmbiguousTypes 扩展程序,并没有让我更进一步。我尝试在类型签名中添加一些 forall a 式的东西,但没有用。

有没有办法让这种模式发挥作用?

1 个答案:

答案 0 :(得分:3)

这是一个相对众所周知的开放式“点菜”限制。

简而言之,如果我们有一个f仿函数本身有一个或多个内部类型索引,那么对于包含该仿函数的开放式和,类型推断会受到很大影响。

说明原因,假设我们有一个包含DSL ()DSL Int的开放总和。 GHC必须为其中一个选择一个实例,但getLastIndex不可能,因为参数或返回类型中未提及a参数。 GHC基本上没有关于a的信息。

这可以使用Data.Proxy

以一种有些笨拙的方式解决
import Data.Proxy

getLastIndex ::
  forall a f m.
  (Functor f, DSL a :<: f, MonadFree f m)
  => Proxy a -> m Index
getLastIndex _ = liftF (inj (GetLastIndex id :: DSL a Index))

或者,如果我们要求开放总和中只有一个DSL,我们可以恢复良好的类型推断和明确性。但是,这个 涉及为:<:(具有内部类型索引的那些)的仿函数重写DSL的类型级查找代码。我们无法通过compdata实际执行此操作,因为它不会导出相关的type-level machinery.

我为你的案例写了一个minimal example来实现上面的内容。我不把它粘贴在这里,因为它有点长而且没有效果。请注意,内部索引的选择完全由仿函数的构造函数和开放的总和决定。这也修复了其他案件的类型推断;例如,对于旧代码,如果Write x f是数字文字或任何多态值,我们必须对x的每次使用进行类型注释,而在新代码中则推断它。

另外,请注意,示例实现仅适用于具有单个内部索引的仿函数!如果我们想要DSL a b next,那么我们也必须为该案例编写新代码,或者使用DSL '(a, b) next代替。