#2708: Error message should suggest UnboxedTuples language extension
---------------------------------+------------------------------------------
Reporter: tim | Owner:
Type: feature request | Status: new
Priority: normal | Component: Compiler (Parser)
Version: 6.9 | Severity: minor
Keywords: | Testcase:
Architecture: Unknown/Multiple | Os: Unknown/Multiple
---------------------------------+------------------------------------------
If I compile this code:
{{{
module Foo where
import GHC.Integer
foo x y =
case x `quotRemInteger` y of
(# y, z #) -> 42
}}}
I get:
{{{
foo.hs:7:5: Parse error in pattern
}}}
It would be better if the error message suggested using
{{{-XUnboxedTuples}}}.
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/2708>
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