#2632: Template Haskell confused by operator fixity
-------------------------+--------------------------------------------------
Reporter: simonpj | Owner: simonpj
Type: bug | Status: new
Priority: normal | Milestone: 6.10.1
Component: Compiler | Version: 6.8.3
Severity: normal | Keywords:
Difficulty: Unknown | Testcase:
Architecture: Unknown | Os: Unknown
-------------------------+--------------------------------------------------
Reported by JCAB
{{{
{-# LANGUAGE TemplateHaskell #-}
module MkData where
import Language.Haskell.TH
import Language.Haskell.TH.Syntax
op a b = a + b
decl = [d| func = 0 `op` 3 |]
}}}
Works with 6.8.3, but with the 6.10 beta, it dies with the strange message
{{{
C:\Users\JCAB\Haskell\THTest>ghc --make main.hs
[1 of 2] Compiling MkData ( MkData.hs, MkData.o )
attempting to use module `main:MkData' (.\MkData.hs) which is not loaded
}}}
When looking up `op`, GHC doesn't find the fixity correctly. (SLPJ
comment: having looked at the code in `RnEnv.lookupFixity` I can't see how
6.8.3 works!)
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/2632>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs