#5630: panic! (the 'impossible' happened) with GADT with -fext-core
-------------------------------+--------------------------------------------
Reporter: quux | Owner:
Type: bug | Status: new
Priority: normal | Component: Compiler
Version: 7.2.1 | Keywords:
Testcase: | Blockedby:
Os: Windows | Blocking:
Architecture: x86_64 (amd64) | Failure: Compile-time crash
-------------------------------+--------------------------------------------
{{{
{-# LANGUAGE GADTs #-}
data T a b where
T1 :: a -> b -> T [a] (a,b)
main = putStrLn ":("
}}}
and then "ghc this.hs -fext-core"
results in
{{{
>ghc core-sandbox.hs -fext-core
ghc core-sandbox.hs -fext-core
[1 of 1] Compiling Main ( core-sandbox.hs, core-sandbox.o )
ghc: panic! (the 'impossible' happened)
(GHC version 7.2.1 for i386-unknown-mingw32):
make_exp (App _ (Coercion _))
Please report this as a GHC bug: http://www.haskell.org/ghc/reportabug
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/5630>
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