#3371: Spurious "Defined but not used" when using record wildcards
-----------------------------+----------------------------------------------
Reporter:  Baughn            |          Owner:                  
    Type:  bug               |         Status:  new             
Priority:  normal            |      Component:  Compiler        
 Version:  6.10.3            |       Severity:  minor           
Keywords:                    |       Testcase:                  
      Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
-----------------------------+----------------------------------------------
 Code such as
 {{{
 {-# LANGUAGE RecordWildCards #-}
 module Test(bar) where

 data Foo = Foo { a, b :: Int } deriving(Eq)

 bar Foo{..} = print a
 }}}
 produces "defined but not used" warnings for both a and b, when compiled
 with -Wall.

 The expected output is that either only a warning for b is given, or none
 is given.

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/3371>
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

Reply via email to