When compiling the following program, the compiler
crashed with a bug. This only happens when compiling
with -O.

------------------------------------------------------
module Test where
import GlaExts
test :: PrimIO ()
test = ioToPrimIO (putStr "bob") `seqPrimIO` test
------------------------------------------------------

------------------------------------------------------
ghc-2.02 -O -c test.hstest.hs:8: 
    Warning: Possibly incomplete patterns
        in a group of case alternatives beginning: 1 -> ...

*** Pattern-matching error within GHC!

This is a compiler bug; please report it to [EMAIL PROTECTED]

Fail: "coreSyn/CoreUtils.lhs", line 122: pattern-matching failed in case
-----------------------------------------------------

I'm using ghc-2.02, with the i386-unknown-solaris2
pre-built distribution.

Cheers,
  Meurig

Reply via email to