#5230: Segfault in cgrun064
----------------------------------+-----------------------------------------
    Reporter:  daniel.is.fischer  |       Owner:  tibbe       
        Type:  bug                |      Status:  new         
    Priority:  normal             |   Component:  Compiler    
     Version:  7.1                |    Keywords:              
    Testcase:                     |   Blockedby:              
          Os:  Linux              |    Blocking:              
Architecture:  x86                |     Failure:  None/Unknown
----------------------------------+-----------------------------------------

Comment(by tibbe):

 Here's a simpler example:

 {{{

 {-# LANGUAGE MagicHash, UnboxedTuples #-}
 module Main (main) where

 import Control.Exception
 import GHC.Exts hiding (copyArray#)
 import GHC.PrimopWrappers (copyArray#)
 import GHC.ST

 main :: IO ()
 main = evaluate $ runST $ ST $ \ s -> case newArray# 32# 0 s of
     (# s2, src #) -> case unsafeFreezeArray# src s2 of
         (# s3, src #) -> case newArray# 32# 1 s3 of
             (# s4, dst #) -> case copyArray# src 0# dst 0# 1# s4 of
                 s5 -> (# s5, () #)
 }}}

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/5230#comment:3>
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

Reply via email to