#4325: Deriving regression
---------------------------------+------------------------------------------
Reporter: igloo | Owner:
Type: bug | Status: new
Priority: highest | Milestone: 7.0.1
Component: Compiler | Version: 6.13
Keywords: | Testcase:
Blockedby: | Difficulty:
Os: Unknown/Multiple | Blocking:
Architecture: Unknown/Multiple | Failure: None/Unknown
---------------------------------+------------------------------------------
First reported here: http://www.haskell.org/pipermail/cvs-
ghc/2010-September/056008.html
This module:
{{{
module Foo where
data Ord a => Heap a b = Empty | Node a b [Heap a b]
deriving Eq
}}}
is rejected by HEAD:
{{{
$ hd -c h.hs
h.hs:1:1:
No instance for (Ord a)
arising from a use of `Node'
In the pattern: Node _ _ _
In an equation for `$con2tag_Heap': $con2tag_Heap (Node _ _ _) = 1#
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/4325>
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