The attached file causes a panic when compiled with ghc6.0 on Linux.

# ghc -fglasgow-exts TH.hs -c
ghc-6.0.1: panic! (the `impossible' happened, GHC version 6.0.1):
        nameModule newLen0 {- v a35 -}

Please report it as a compiler bug to [EMAIL PROTECTED],
or http://sourceforge.net/projects/ghc/.
module T where

bp :: Int -> IO Int
bp newLen0 =
   do
      let
         newLen =
            $( 
               -- work around GHC6 bug
               if True
                  then
                     [| max 1 newLen0 |]
                  else
                     [| newLen0 |]
               )
      return newLen
_______________________________________________
Glasgow-haskell-bugs mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to