有没有办法用隐式参数创建函数或者使用模板haskell让隐式参数绑定?
即。是否可以使用模板haskell生成这样的签名:
doSomething :: (?context :: Context) => m a
或者像这样的调用:
invoc = let ?context = newContext in doSomething
我找不到合适的代数数据类型,也找不到任何可以帮助我在API documentation for template haskell中讨论这个主题的函数。我正在使用GHC 7.4.2。
如果在模板haskell中没有对此扩展的本机支持,是否还有其他可能在编译期间注入代码(可能类似于模板haskell中的一般“代码注入函数”?)。
编辑: 我尝试了评论中的建议,这就是:
runQ [d| f :: (?c :: String) => Int ; f = 7 |]
<interactive>:10:17: parse error on input `c'
虽然这有效:
runQ [d| f :: Int ; f = 7|]
[SigD f_0 (ConT GHC.Types.Int),ValD (VarP f_0) (NormalB (LitE (IntegerL 7))) []]
似乎不受支持。
答案 0 :(得分:3)
这是一种相当脆弱的方式,但有点像。虽然你不能参考 在模板haskell使用的Exp中的?x,您可以参考中的定义 另一个模块如:
reserved_prefix_x = ?x
下面是一些在ghc运行中生成上述变量的代码, 在第二轮ghc中,变量实际上是指隐含参数。
{-# LANGUAGE TemplateHaskell, NoMonomorphismRestriction #-}
module GenMod (h) where
import Data.Generics
import Data.IORef
import Data.List
import Language.Haskell.Meta.Parse as P
import Language.Haskell.TH
import Language.Haskell.TH.Quote
import Language.Haskell.TH.Syntax
import qualified Data.Set as S
import qualified Language.Haskell.Exts.QQ as Q
import System.IO.Unsafe
h = Q.hs { quoteExp = \s -> do
r <- either fail (upVars . return) (P.parseExp s)
writeMod'
return r
}
pfx = "q_"
{-# NOINLINE vars #-}
vars :: IORef (S.Set String)
vars = unsafePerformIO (newIORef S.empty)
writeMod' = runIO $ writeFile "GEN.hs" . ppMod =<< readIORef vars
writeMod = -- might be needed to avoid multiple calls to writeFile?
-- in this example this is called for every use of `h'
QuasiQuoter { quoteDec = \ _ -> do
writeMod'
[d| _ = () |] }
ppMod xs = "{-# LANGUAGE NoMonomorphismRestriction, ImplicitParams #-}\n\
\module GEN where\n" ++
unlines (map (\x -> pfx ++ x ++ " = ?" ++ x) (S.toList xs))
upVars x = do
x' <- x
runIO $ modifyIORef vars (S.union (getMatchingVars x'))
runIO $ print =<< readIORef vars
return x'
getMatchingVars =
everything
S.union
(mkQ S.empty
(\ (OccName x) -> maybe S.empty S.singleton (stripPrefix pfx x)))
使用quasiquoter GenMod.hs的Main.hs文件:
{-# LANGUAGE NoMonomorphismRestriction, ImplicitParams, QuasiQuotes, TemplateHaskell, CPP #-}
import GenMod
#ifndef stage1
import GEN
#endif
f_ = [h| q_hithere |]
你必须两次打电话给ghc,比如:
ghci -Dstage1 Main.hs
GHCi, version 7.6.1: http://www.haskell.org/ghc/ :? for help
[1 of 2] Compiling GenMod ( GenMod.hs, interpreted )
[2 of 2] Compiling Main ( Ex.hs, interpreted )
fromList ["hithere"]
Ex.hs:8:6: Not in scope: `q_hithere'
Failed, modules loaded: GenMod.
虽然ghc失败了,但它仍然会生成包含以下内容的GEN.h:
{-# LANGUAGE NoMonomorphismRestriction, ImplicitParams #-}
module GEN where
q_hithere = ?hithere
当你加载Main(省略-D标志)
时会出现这种情况*Main> :t f_
f_ :: (?hithere::t) => t
这种麻烦可能不值得。也许从TH调用其他程序的其他情况更具激励性,例如内联调用其他语言http://hpaste.org/50837(gfortran示例)
由于我使用了haskell-src-meta的默认解析器,因此quasiquote使用变量“reserved_prefix_x”而不是“?x”。应该可以毫无困难地接受“?x”。