[GHC] #8377: GHCi crashes with unboxed values on 32-bit platforms

GHC ghc-devs at haskell.org
Sat Sep 28 13:02:09 CEST 2013


#8377: GHCi crashes with unboxed values on 32-bit platforms
---------------------------+-------------------------------------
       Reporter:  akio     |             Owner:
           Type:  bug      |            Status:  new
       Priority:  normal   |         Milestone:
      Component:  GHCi     |           Version:  7.7
       Keywords:           |  Operating System:  Unknown/Multiple
   Architecture:  x86      |   Type of failure:  GHCi crash
     Difficulty:  Unknown  |         Test Case:
     Blocked By:           |          Blocking:
Related Tickets:           |
---------------------------+-------------------------------------
 The following program causes GHCi to crash, on x86 Linux and x86 Windows.

 {{{
 {-# LANGUAGE MagicHash #-}
 import System.Mem
 import GHC.Base

 main = do
   let list = concatMap buildThunk [0..10000]
   length list `seq` performGC
   print $ last list

 buildThunk :: Int -> [Int]
 buildThunk (I# k) = [f k]

 f :: Int# -> Int
 f x = I# x
 }}}

-- 
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8377>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler



More information about the ghc-tickets mailing list