我正在尝试使用提示( Language.Haskell.Interpreter)在运行时编译Polysemy monad 值。
当我尝试这样做时,我可靠地得到一个关于:
在“交互式”代码中不当使用运算符的错误;似乎传递给 GHC 的文本提示中有语法错误。
{-# LANGUAGE DataKinds #-}
module Main where
import Polysemy (Embed, embed, runM, Sem)
import Language.Haskell.Interpreter (as, interpret, Interpreter, runInterpreter, setImportsQ)
import Data.Typeable (typeOf)
import Control.Monad.IO.Class (liftIO)
main :: IO ()
main = do
-- Hint works fine to interpret a String:
m <- interpretWithErrors exampleHint
print m
-- And Sem works fine:
runM exampleSem
-- But notice the weird detected type:
print $ typeOf exampleSem
-- And now Hint fails to interpret a Sem:
s <- interpretWithErrors exampleBoth
print $ typeOf s
runM s
type MyEffect = Sem '[Embed IO] ()
exampleSem :: MyEffect
exampleSem = embed $ print "Successful Sem!"
exampleHint :: Interpreter String
exampleHint = do
setImportsQ [("Prelude", Nothing)]
interpret "\"Successful Hint!\"" (as :: String)
exampleBoth :: Interpreter MyEffect
exampleBoth = do
setImportsQ [("Prelude", Nothing), ("Polysemy", Nothing)]
liftIO $ print "Successfully imported!"
-- This is where it fails:
s <- interpret "embed $ print \"Success!\"" (as :: MyEffect)
liftIO $ print "Successfully interpreted!"
return s
interpretWithErrors :: Interpreter a -> IO a
interpretWithErrors i_a = do
e_e_a <- runInterpreter i_a
either (ioError . userError . show) (return) e_e_a
运行上面的打印:
"Successful Hint!"
"Successful Sem!"
Sem (': ((* -> *) -> * -> *) (Embed IO) ('[] ((* -> *) -> * -> *))) ()
"Successfully imported!"
Hint-Polysemy: user error (WontCompile [GhcError {errMsg = "<interactive>:3:41: error: Operator applied to too few arguments: :"}])
一些注意事项:
- 我正在使用 cabal,为了
import
在解释器 monad 中传递该行,我必须从 cabal 沙盒外壳中运行它,因为 Polysemy 没有安装到我的机器上。 - 也就是说,我不认为 cabal 或进口 Polysemy 是问题。如果我只是忽略导入 Polysemy 而只是
setImportsQ [("Prelude", Nothing)]
. - 我正在解释的字符串甚至不需要是一个有效的表达式;我可以在不更改错误的情况下将乱码放在那里。这向我表明问题出在
(as :: MyEffect)
. - 我包括
typeOf
证明那MyEffect
是事实Typeable
。 - 我不知道为什么
typeOf exampleSem
要给出如此长而奇怪的类型签名。我确实认为这在某种程度上是问题所在。重新排列MyEffect
到type MyEffect = Sem ((Embed IO) : []) ()
没有效果。
如果我做错了什么,任何人都清楚吗?我应该如何尝试调试这个问题?假设这是Type.Reflection.Typeable
中的提示、多义或(不太可能)中的错误,我下一步将如何尝试修复它?我想我必须以某种方式确定哪个库有问题?
这是对先前问题的改进。这是原文。