#344: arrow notation: incorrect scope of existential dictionaries
--------------------------------------+-------------------------------------
Reporter: nobody | Owner: ross
Type: bug | Status: new
Priority: normal | Milestone: 6.12 branch
Component: Compiler (Type checker) | Version: 6.4
Resolution: None | Keywords:
Difficulty: Unknown | Os: Unknown/Multiple
Testcase: | Architecture: Unknown/Multiple
Failure: None/Unknown |
--------------------------------------+-------------------------------------
Changes (by simonmar):
* failure: => None/Unknown
Comment:
To summarise, here's the program that fails core lint:
{{{
{-# OPTIONS -farrows -fglasgow-exts -dcore-lint #-}
module GHCbug where
class Foo a where foo :: a -> ()
data Bar = forall a. Foo a => Bar a
get :: Bar -> ()
get = proc x -> case x of Bar a -> do {y <- id -< a; id -< foo a}
}}}
Still failing in 6.12.1 RC.
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/344#comment:14>
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