3 Sep
2008
3 Sep
'08
5:11 p.m.
Is there a way to write something like this? -- packages: template-haskell -- ghc-options: -fth module Main where import Language.Haskell.TH import Control.Monad main = do putStrLn . show =<< runQ [d| class $(mkName "abc") m elc stc3 elc3 st2 el2 st3 el3 -- line 9 | st2 stc3 -> st3, el2 elc3 -> el3 where $(mkName "foo") :: m Int elc Int elc stc3 elc3 a -> m st el st2 el2 st3 el3 a |] |9 col 12| parse error on input `$(' Marc Weber