Re: [GHC] #3873: template haskell: incorrect Warning: defined but not used

2010-02-11 Thread GHC
#3873: template haskell: incorrect Warning: defined but not used
+---
  Reporter:  JakeWheat  |  Owner:   
   
  Type:  bug| Status:  closed   
   
  Priority:  normal |  Milestone:   
   
 Component:  Compiler   |Version:  6.12.1   
   
Resolution:  fixed  |   Keywords:   
   
Difficulty: | Os:  
Unknown/Multiple
  Testcase: |   Architecture:  
Unknown/Multiple
   Failure:  Incorrect warning at compile-time  |  
+---
Changes (by simonpj):

  * status:  new = closed
  * resolution:  = fixed


Comment:

 Happily the fix for #3845 does this too.

 Simon

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3873#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler
___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #3873: template haskell: incorrect Warning: defined but not used

2010-02-10 Thread GHC
#3873: template haskell: incorrect Warning: defined but not used
-+--
Reporter:  JakeWheat |   Owner: 
  
Type:  bug   |  Status:  new
  
Priority:  normal|   Component:  Compiler   
  
 Version:  6.12.1|Keywords: 
  
  Os:  Unknown/Multiple  |Testcase: 
  
Architecture:  Unknown/Multiple  | Failure:  Incorrect warning at 
compile-time
-+--
 example code:
 {{{
 {-# LANGUAGE TemplateHaskell #-}

 module THWarnBug where

 import Language.Haskell.TH

 mhlt :: Q Type
 mhlt = do
   let u = [t| String |]
   [t| $u |]

 }}}

 compiling gives:

 {{{
 $ ghc -c -Wall THWarnBug.hs

 THWarnBug.hs:9:6: Warning: Defined but not used: `u'
 }}}

 but obviously u is used.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3873
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler
___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs