Re: [GHC] #7500: GHC: internal error: getMBlock: mmap: Operation not permitted

2013-01-09 Thread GHC
#7500: GHC: internal error: getMBlock: mmap: Operation not permitted
+---
  Reporter:  guest  |  Owner:  
  Type:  bug| Status:  new 
  Priority:  normal |  Milestone:  
 Component:  Compiler   |Version:  7.4.1   
Resolution: |   Keywords:  
Os:  Linux  |   Architecture:  Unknown/Multiple
   Failure:  Runtime crash  | Difficulty:  Unknown 
  Testcase: |  Blockedby:  
  Blocking: |Related:  
+---
Changes (by simonmar):

  * status:  closed = new
  * resolution:  invalid =


Comment:

 If this is a simple case of running out of memory, then we ought to emit
 the correct error message rather than a panic.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7500#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7400: Strange closure type 17 internal error

2013-01-07 Thread GHC
#7400: Strange closure type 17 internal error
-+--
  Reporter:  ropoctl |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  highest |  Milestone:  7.6.2 
 Component:  Runtime System  |Version:  7.4.2 
Resolution:  invalid |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by igloo):

  * status:  infoneeded = closed
  * resolution:  = invalid


Comment:

 No response from submitter, so closing

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7500: GHC: internal error: getMBlock: mmap: Operation not permitted

2013-01-03 Thread GHC
#7500: GHC: internal error: getMBlock: mmap: Operation not permitted
+---
  Reporter:  guest  |  Owner:  
  Type:  bug| Status:  closed  
  Priority:  normal |  Milestone:  
 Component:  Compiler   |Version:  7.4.1   
Resolution:  invalid|   Keywords:  
Os:  Linux  |   Architecture:  Unknown/Multiple
   Failure:  Runtime crash  | Difficulty:  Unknown 
  Testcase: |  Blockedby:  
  Blocking: |Related:  
+---
Changes (by igloo):

  * status:  infoneeded = closed
  * difficulty:  = Unknown
  * resolution:  = invalid


Comment:

 I don't think there's a bug here: on a 32bit platform, a single process is
 still limited to 2G of memory.

 If you still think there's something wrong, please reopen and clarify what
 behaviour you were expecting.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7500#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7500: GHC: internal error: getMBlock: mmap: Operation not permitted

2012-12-15 Thread GHC
#7500: GHC: internal error: getMBlock: mmap: Operation not permitted
--+-
Reporter:  guest  |  Owner:  
Type:  bug| Status:  infoneeded  
Priority:  normal |  Component:  Compiler
 Version:  7.4.1  |   Keywords:  
  Os:  Linux  |   Architecture:  Unknown/Multiple
 Failure:  Runtime crash  |  Blockedby:  
Blocking: |Related:  
--+-
Changes (by ezyang):

  * status:  new = infoneeded


Comment:

 Returning EPERM from mmap when PROT_EXEC is not specified should be
 impossible on Linux. What is your kernel version?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7500#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7500: GHC: internal error: getMBlock: mmap: Operation not permitted

2012-12-14 Thread GHC
#7500: GHC: internal error: getMBlock: mmap: Operation not permitted
--+-
Reporter:  guest  |  Owner:  
Type:  bug| Status:  new 
Priority:  normal |  Component:  Compiler
 Version:  7.4.1  |   Keywords:  
  Os:  Linux  |   Architecture:  Unknown/Multiple
 Failure:  Runtime crash  |  Blockedby:  
Blocking: |Related:  
--+-
 Trying to calculate partition of a number using generating fuction with
 memoization, like this:


 {{{
 #!/usr/bin/runhaskell

 part'' :: Int - Integer
 part'' = ( map part' [0..] !!)

 part' :: Int - Integer
 part' 0 = 1
 part' 1 = 1
 part' n =
 sum $ map (\k -
 let kk = fromInteger(k); k1 = floor(1/2*kk*(3*kk-1)); k2 =
 floor(1/2*kk*(3*kk+1)) in
 (-1)^(k+1) * ( (part (n-k1)) + (part (n-k2))) ) [1..toInteger(n)]

 part n =
 if n  0 then 0 else part'' n

 main = print $ part 2

 }}}

 Then i watch how memory usage grows up to 2G (RES) and program stops:

 {{{
 ./bug.hs
 bug.hs: internal error: getMBlock: mmap: Operation not permitted
 (GHC version 7.4.1 for i386_unknown_linux)
 Please report this as a GHC bug:  http://www.haskell.org/ghc/reportab
 }}}

 The kernel is compiled with PAE, and machine has 8G of RAM

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7500
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-12-02 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  new   
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+
Changes (by awson):

  * status:  infoneeded = new


Comment:

 But after this fix ghc is unable to use more than 2GB of memory, AFAIK.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:12
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-12-02 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  new   
Priority:  highest |   Milestone:  7.8.1 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+
Changes (by igloo):

  * milestone:  7.6.2 = 7.8.1


Comment:

 Thanks for testing. Fixed in 7.6 by:
 {{{
 commit 418a8c926703ac284f7b1a39900722efa02d0834
 Author: Ian Lynagh ig...@earth.li
 Date:   Sun Dec 2 14:48:20 2012 +

 On Win64, mark executables as not supporting bigaddr; fixes #7134

 This is a kludge, and means that ghc/haddock won't be able to use
 more than 2G of RAM. But it'll make sure that ghci works in the short
 term while we work on a proper fix.
 }}}

 Replying to [comment:12 awson]:
  But after this fix ghc is unable to use more than 2GB of memory,
 AFAIK.

 Yes, hopefully we'll have a better fix for 7.8.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:13
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-12-01 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  infoneeded
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+

Comment(by igloo):

 Thanks cetinsert. I've put the bigaddr=0 version of the ghc.exe from the
 7.6.1 release here:
 http://www.haskell.org/ghc/dist/tmp/peflags-7.6.1/

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:10
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-12-01 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  infoneeded
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+

Comment(by cetinsert):

 Sorry TRAC kept saying “error: database is locked” so I had to try
 contacting you by email.

 Good news, GHCI runs successfully without any errors when I use the binary
 you uploaded!

 Thanks a lot for fixing this issue! Looking forward to 7.6.2!

 Screenshot: http://snag.gy/cey48.jpg
 [[Image(http://snag.gy/cey48.jpg)]]

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:11
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-11-30 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  infoneeded
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+
Changes (by igloo):

  * status:  new = infoneeded


Comment:

 If you run
 {{{
 peflags --bigaddr=0 c:/ghc/ghc-7.6.1/bin/ghc.exe
 }}}
 then does ghci work afterwards?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:7
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-11-30 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  infoneeded
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+

Comment(by cetinsert):

 I would like to test this but cannot find anything named peflags to run.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:8
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-11-30 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:  igloo 
Type:  bug |  Status:  infoneeded
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+

Comment(by cetinsert):

 Would it be possible to put the ghc binary that results from peflags
 --bigaddr=0 online, then I could download and report back immediately?
 Or the peflags binary itself at least.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:9
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7400: Strange closure type 17 internal error

2012-11-19 Thread GHC
#7400: Strange closure type 17 internal error
---+
Reporter:  ropoctl |   Owner:  simonmar 
Type:  bug |  Status:  infoneeded   
Priority:  highest |   Milestone:  7.6.2
   Component:  Runtime System  | Version:  7.4.2
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  |  
---+
Changes (by simonmar):

  * status:  new = infoneeded


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7390: Setup.hs: internal error: stg_ap_v_ret (MacOS)

2012-11-19 Thread GHC
#7390: Setup.hs: internal error: stg_ap_v_ret (MacOS)
--+-
 Reporter:  guest |  Owner:
 Type:  bug   | Status:  new   
 Priority:  normal|  Component:  Compiler  
  Version:  7.4.1 |   Keywords:
   Os:  Unknown/Multiple  |   Architecture:  x86_64 (amd64)
  Failure:  None/Unknown  |   Testcase:
Blockedby:|   Blocking:
  Related:|  
--+-
Changes (by PHO):

 * cc: pho@… (added)


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7390#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7400: Strange closure type 17 internal error

2012-11-13 Thread GHC
#7400: Strange closure type 17 internal error
---+
Reporter:  ropoctl |   Owner:  simonmar 
Type:  bug |  Status:  new  
Priority:  highest |   Milestone:  7.6.2
   Component:  Runtime System  | Version:  7.4.2
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  |  
---+

Comment(by simonmar):

 Can you tell me how to reproduce this?

 I presume the module name should be `Main`, not `Resample`.  What input
 does the program need?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7400: Strange closure type 17 internal error

2012-11-12 Thread GHC
#7400: Strange closure type 17 internal error
---+
Reporter:  ropoctl |   Owner:  simonmar 
Type:  bug |  Status:  new  
Priority:  highest |   Milestone:  7.6.2
   Component:  Runtime System  | Version:  7.4.2
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  |  
---+
Changes (by simonpj):

  * owner:  = simonmar


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7400: Strange closure type 17 internal error

2012-11-09 Thread GHC
#7400: Strange closure type 17 internal error
---+
Reporter:  ropoctl |   Owner:   
Type:  bug |  Status:  new  
Priority:  highest |   Milestone:  7.6.2
   Component:  Runtime System  | Version:  7.4.2
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  |  
---+
Changes (by simonmar):

  * priority:  normal = highest
  * difficulty:  = Unknown
  * milestone:  = 7.6.2
  * failure:  None/Unknown = Runtime crash


Comment:

 Thanks for the report, we'll take a look.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7400: Strange closure type 17 internal error

2012-11-08 Thread GHC
#7400: Strange closure type 17 internal error
-+--
Reporter:  ropoctl   |  Owner:
Type:  bug   | Status:  new   
Priority:  normal|  Component:  Runtime System
 Version:  7.4.2 |   Keywords:
  Os:  Linux |   Architecture:  x86_64 (amd64)
 Failure:  None/Unknown  |  Blockedby:
Blocking:|Related:
-+--
 resample: internal error: evacuate(static): strange closure type 17
 (GHC version 7.4.2 for x86_64_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 {{{
 module Resample where

 import Data.List
 import qualified Data.ByteString as B
 import qualified Data.ByteString.Char8 as BC
 import qualified Data.ByteString.Lazy.Char8 as BL
 import qualified Data.ByteString.Lazy as BB

 import qualified Data.Vector as V
 import System.Random.Mersenne
 import Control.Monad (liftM, replicateM_)

 readCollapsed :: FilePath - IO [(Int, B.ByteString)]
 readCollapsed f = ((map (either error id) . unfoldr parse) . BL.lines)
 `fmap` BL.readFile f

 parse :: [BL.ByteString] - Maybe (Either String (Int, B.ByteString),
 [BL.ByteString])
 parse (c:sq:rest) =
 Just (Right (read $ BL.unpack c, B.concat $ BL.toChunks sq), rest)
 parse [] = Nothing
 parse fs = let showStanza = unlines (map BL.unpack fs)
err = Left $ Resample: illegal number of lines:  ++
 showStanza
in Just (err, [])

 uncollapse :: (Int, B.ByteString) - [B.ByteString]
 uncollapse (c, sq) = take c $ repeat sq

 randomPick' mt vec len = liftM (vec V.!) $ liftM ((flip mod) len) (random
 mt)

 main :: IO ()
 main = do
 sqvec - liftM (V.fromList . Prelude.concatMap uncollapse) $
 readCollapsed /dev/stdin
 let seqlen = V.length sqvec
 mtgen - newMTGen Nothing
 replicateM_ 3000 $ BC.putStrLn = randomPick' mtgen sqvec seqlen
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7400
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-11-06 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  normal  |  Milestone:  7.6.2 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  fixed   |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  rts/7087|  Blockedby:
  Blocking:  |Related:
-+--
Changes (by pcapriotti):

  * status:  merge = closed


Comment:

 Merged as 306ab5509fceb5ccaf6f94fe18b92ae6b476.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:6
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7390: Setup.hs: internal error: stg_ap_v_ret (MacOS)

2012-11-03 Thread GHC
#7390: Setup.hs: internal error: stg_ap_v_ret (MacOS)
--+-
 Reporter:  guest |  Owner:
 Type:  bug   | Status:  new   
 Priority:  normal|  Component:  Compiler  
  Version:  7.4.1 |   Keywords:
   Os:  Unknown/Multiple  |   Architecture:  x86_64 (amd64)
  Failure:  None/Unknown  |   Testcase:
Blockedby:|   Blocking:
  Related:|  
--+-
 I was trying to build some haskell.  Here's what happened:

 $ runhaskell Setup.hs configure
 Configuring c0c-3.9...
 Setup.hs: At least the following dependencies are missing:
 mtl -any, syb -any
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs configure
 Configuring c0c-3.9...
 Setup.hs: At least the following dependencies are missing:
 mtl -any, syb -any
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs build
 Setup.hs: Run the 'configure' command first.
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs build
 Setup.hs: internal error: stg_ap_v_ret
 (GHC version 7.4.1 for x86_64_apple_darwin)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 $ runhaskell Setup.hs configure
 $ runhaskell Setup.hs build
 $

 In addition to the failure which it told me to report, it appears to be
 sometimes unable to locate the mtl and syb packages which I installed.  I
 don't know if these are related.  My platform is MacOS 10.6 on which I
 installed the tarball of ghc with gcc47 as my default gcc and haskell-
 platform version 2012.2.0.0 (built from source).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7390
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7370: GHC crash (internal error) on vector

2012-10-26 Thread GHC
#7370: GHC crash (internal error) on vector
---+
 Reporter:  voidex |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.6.1  |   Keywords:
   Os:  Windows|   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+
 `cabal install vector` caused GHC to crash

 Here is output:

 Downloading vector-0.10.0.1...
 Configuring vector-0.10.0.1...
 Building vector-0.10.0.1...
 Preprocessing library vector-0.10.0.1...
 [ 1 of 19] Compiling Data.Vector.Storable.Internal (
 Data\Vector\Storable\Internal.hs, dist\build\Data\Vector\Storable\I
 nternal.o )
 [ 2 of 19] Compiling Data.Vector.Fusion.Util ( Data\Vector\Fusion\Util.hs,
 dist\build\Data\Vector\Fusion\Util.o )
 [ 3 of 19] Compiling Data.Vector.Fusion.Stream.Size (
 Data\Vector\Fusion\Stream\Size.hs, dist\build\Data\Vector\Fusion\S
 tream\Size.o )

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `*'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `abs'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `signum'
 In the instance declaration for `Num Size'
 [ 4 of 19] Compiling Data.Vector.Internal.Check (
 Data\Vector\Internal\Check.hs, dist\build\Data\Vector\Internal\Check.o
  )
 [ 5 of 19] Compiling Data.Vector.Fusion.Stream.Monadic (
 Data\Vector\Fusion\Stream\Monadic.hs, dist\build\Data\Vector\Fu
 sion\Stream\Monadic.o )
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: High bits are set in 7ff718995a0 for WaitForSingleObject
 (GHC version 7.6.1 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.
 Failed to install vector-0.10.0.1

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7370
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7370: GHC crash (internal error) on vector

2012-10-26 Thread GHC
#7370: GHC crash (internal error) on vector
+---
  Reporter:  voidex |  Owner:
  Type:  bug| Status:  closed
  Priority:  normal |  Milestone:
 Component:  Compiler   |Version:  7.6.1 
Resolution:  fixed  |   Keywords:
Os:  Windows|   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash  | Difficulty:  Unknown   
  Testcase: |  Blockedby:
  Blocking: |Related:
+---
Changes (by igloo):

  * status:  new = closed
  * difficulty:  = Unknown
  * resolution:  = fixed


Comment:

 Thanks for the report. However, this is a duplicate of #7357.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7370#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7357: GHC.exe gives an internal error while linking vector's Monadic.hs

2012-10-25 Thread GHC
#7357: GHC.exe gives an internal error while linking vector's Monadic.hs
---+
Reporter:  kapilash|   Owner:
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:  7.8.1 
   Component:  GHCi| Version:  7.6.1 
Keywords:  |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  Compile-time crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  3658|Blocking:
 Related:  |  
---+
Changes (by igloo):

  * owner:  igloo =
  * component:  Compiler = GHCi
  * blockedby:  = 3658


Comment:

 I can't reproduce this for some reason.

 Nevertheless, it would be fixed by #3658.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7357#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7357: GHC.exe gives an internal error while linking vector's Monadic.hs

2012-10-22 Thread GHC
#7357: GHC.exe gives an internal error while linking vector's Monadic.hs
---+
Reporter:  kapilash|   Owner:  igloo 
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:  7.8.1 
   Component:  Compiler| Version:  7.6.1 
Keywords:  |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  Compile-time crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Changes (by igloo):

  * owner:  = igloo
  * difficulty:  = Unknown
  * milestone:  = 7.8.1


Comment:

 Thanks for the report. I'll take a look.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7357#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7357: GHC.exe gives an internal error while linking vector's Monadic.hs

2012-10-22 Thread GHC
#7357: GHC.exe gives an internal error while linking vector's Monadic.hs
---+
Reporter:  kapilash|   Owner:  igloo 
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:  7.8.1 
   Component:  Compiler| Version:  7.6.1 
Keywords:  |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  Compile-time crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Description changed by igloo:

Old description:

 '''This is the command line output when building vector 0.10.0.1'''


 '''c:\local\vector-0.10.0.1'''cabal build
 Building vector-0.10.0.1...
 Preprocessing library vector-0.10.0.1...
 [ 1 of 19] Compiling Data.Vector.Storable.Internal (
 Data\Vector\Storable\Intern
 al.hs, dist\build\Data\Vector\Storable\Internal.o )
 [ 2 of 19] Compiling Data.Vector.Fusion.Util (
 Data\Vector\Fusion\Util.hs, dist\
 build\Data\Vector\Fusion\Util.o )
 [ 3 of 19] Compiling Data.Vector.Fusion.Stream.Size (
 Data\Vector\Fusion\Stream\
 Size.hs, dist\build\Data\Vector\Fusion\Stream\Size.o )

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `*'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `abs'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `signum'
 In the instance declaration for `Num Size'
 [ 4 of 19] Compiling Data.Vector.Internal.Check (
 Data\Vector\Internal\Check.hs,
  dist\build\Data\Vector\Internal\Check.o )
 [ 5 of 19] Compiling Data.Vector.Fusion.Stream.Monadic (
 Data\Vector\Fusion\Stre
 am\Monadic.hs, dist\build\Data\Vector\Fusion\Stream\Monadic.o )
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: Hig
 h bits are set in 7fcb3ea95a0 for WaitForSingleObject
 (GHC version 7.6.1 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.

New description:

 '''This is the command line output when building vector 0.10.0.1'''

 {{{
 c:\local\vector-0.10.0.1cabal build
 Building vector-0.10.0.1...
 Preprocessing library vector-0.10.0.1...
 [ 1 of 19] Compiling Data.Vector.Storable.Internal (
 Data\Vector\Storable\Intern
 al.hs, dist\build\Data\Vector\Storable\Internal.o )
 [ 2 of 19] Compiling Data.Vector.Fusion.Util ( Data\Vector\Fusion\Util.hs,
 dist\
 build\Data\Vector\Fusion\Util.o )
 [ 3 of 19] Compiling Data.Vector.Fusion.Stream.Size (
 Data\Vector\Fusion\Stream\
 Size.hs, dist\build\Data\Vector\Fusion\Stream\Size.o )

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `*'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `abs'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `signum'
 In the instance declaration for `Num Size'
 [ 4 of 19] Compiling Data.Vector.Internal.Check (
 Data\Vector\Internal\Check.hs,
  dist\build\Data\Vector\Internal\Check.o )
 [ 5 of 19] Compiling Data.Vector.Fusion.Stream.Monadic (
 Data\Vector\Fusion\Stre
 am\Monadic.hs, dist\build\Data\Vector\Fusion\Stream\Monadic.o )
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: Hig
 h bits are set in 7fcb3ea95a0 for WaitForSingleObject
 (GHC version 7.6.1 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.
 }}}

--

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7357#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-10-22 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:  simonmar  
  Type:  bug | Status:  merge 
  Priority:  normal  |  Milestone:  7.6.2 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  fixed   |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  rts/7087|  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * status:  closed = merge
  * milestone:  7.6.1 = 7.6.2


Comment:

 We should have merged this one; see #7325

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type 66562

2012-10-22 Thread GHC
#7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type
66562
-+--
  Reporter:  aristidb|  Owner:
  Type:  bug | Status:  closed
  Priority:  normal  |  Milestone:
 Component:  Runtime System  |Version:  7.4.2 
Resolution:  worksforme  |   Keywords:
Os:  MacOS X |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * status:  new = closed
  * difficulty:  = Unknown
  * resolution:  = worksforme


Comment:

 Thanks, I'm closing the ticket for now, you can re-open if on closer
 inspection it does appear to be a GHC bug.

 Feel free to email me to help out with debugging.  You might want to check
 out our debugging resources at [wiki:Debugging].  The first thing you want
 to do is narrow down the problem as much as possible by simplifying the
 test case and removing extraneous code and dependencies.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7302#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-22 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
Reporter:  heisenbug   |   Owner:   
Type:  bug |  Status:  new  
Priority:  normal  |   Milestone:  7.8.1
   Component:  Compiler| Version:  7.7  
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:  yes  
   Blockedby:  |Blocking:   
 Related:  |  
---+

Comment(by heisenbug):

 It turns out that simply mixing GADTs + unsafeCoerce triggers the bug.
 (see freshly attached.. crash.hs) The order of the GADT constructors
 (being defined) seems to matter, swapping them changes a crash to some
 (apparently) undefined behaviour (neither output, nor pattern match
 failure).

  I suspect that unsafeCoerce does not preserve pointer tagging. 

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-22 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
+---
  Reporter:  heisenbug  |  Owner:
  Type:  bug| Status:  closed
  Priority:  normal |  Milestone:  7.8.1 
 Component:  Compiler   |Version:  7.7   
Resolution:  invalid|   Keywords:
Os:  Linux  |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash  | Difficulty:  Unknown   
  Testcase:  yes|  Blockedby:
  Blocking: |Related:
+---
Changes (by igloo):

  * status:  new = closed
  * resolution:  = invalid


Comment:

 `int-e` in #ghc diagnosed this:
 {{{
 GHC correctly infers that when it gets a value
 of type forall a. TypedPair a, then there is no constructor
 that can match.

 And it happily creates a case statement without alternatives,
 relying on the value to be bottom. The code, however, produces
 a non-bottom value of the type. What will happen then is
 unpredictable. (Interestingly, ghc 7.4.1 created a fresh
 bottom value instead, which is arguably more friendly.)
 }}}

 {{{
 Main.main :: GHC.Types.IO ()
 [GblId, Str=DmdType b]
 Main.main =
   case Unsafe.Coerce.unsafeCoerce
  @ (Main.TypedPair GHC.Types.Int)
  @ (Main.TypedPair (GHC.Prim.Any *))
  Main.$WTPInt
   of _ {
   }
 }}}

 This therefore looks like it isn't a bug - just an invalid use of
 `unsafeCoerce`.

 Thanks for taking the time to make such a small testcase, though. And
 thanks too to `int-e` for the diagnosis.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:6
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-22 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
+---
  Reporter:  heisenbug  |  Owner:
  Type:  bug| Status:  closed
  Priority:  normal |  Milestone:  7.8.1 
 Component:  Compiler   |Version:  7.7   
Resolution:  invalid|   Keywords:
Os:  Linux  |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash  | Difficulty:  Unknown   
  Testcase:  yes|  Blockedby:
  Blocking: |Related:
+---

Comment(by int-e):

 Interestingly, ghc 7.4.1 used to produce a {{{runTimeError Impossible
 case alternative}}} for such cases rather than relying on the given value
 to be bottom. Is this the result of an optimization (getting rid of
 unreachable default branches in case, say) or an actual regression?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:7
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7357: GHC.exe gives an internal error while linking vector's Monadic.hs

2012-10-21 Thread GHC
#7357: GHC.exe gives an internal error while linking vector's Monadic.hs
+---
 Reporter:  kapilash|  Owner:
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  Compiler  
  Version:  7.6.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  Compile-time crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
 '''This is the command line output when building vector 0.10.0.1'''


 '''c:\local\vector-0.10.0.1'''cabal build
 Building vector-0.10.0.1...
 Preprocessing library vector-0.10.0.1...
 [ 1 of 19] Compiling Data.Vector.Storable.Internal (
 Data\Vector\Storable\Intern
 al.hs, dist\build\Data\Vector\Storable\Internal.o )
 [ 2 of 19] Compiling Data.Vector.Fusion.Util ( Data\Vector\Fusion\Util.hs,
 dist\
 build\Data\Vector\Fusion\Util.o )
 [ 3 of 19] Compiling Data.Vector.Fusion.Stream.Size (
 Data\Vector\Fusion\Stream\
 Size.hs, dist\build\Data\Vector\Fusion\Stream\Size.o )

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `*'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `abs'
 In the instance declaration for `Num Size'

 Data\Vector\Fusion\Stream\Size.hs:25:10: Warning:
 No explicit method or default declaration for `signum'
 In the instance declaration for `Num Size'
 [ 4 of 19] Compiling Data.Vector.Internal.Check (
 Data\Vector\Internal\Check.hs,
  dist\build\Data\Vector\Internal\Check.o )
 [ 5 of 19] Compiling Data.Vector.Fusion.Stream.Monadic (
 Data\Vector\Fusion\Stre
 am\Monadic.hs, dist\build\Data\Vector\Fusion\Stream\Monadic.o )
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: Hig
 h bits are set in 7fcb3ea95a0 for WaitForSingleObject
 (GHC version 7.6.1 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7357
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-16 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
Reporter:  heisenbug   |   Owner:   
Type:  bug |  Status:  new  
Priority:  normal  |   Milestone:  7.8.1
   Component:  Compiler| Version:  7.7  
Keywords:  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:  yes  
   Blockedby:  |Blocking:   
 Related:  |  
---+
Changes (by igloo):

  * difficulty:  = Unknown
  * milestone:  = 7.8.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type 66562

2012-10-15 Thread GHC
#7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type
66562
---+
 Reporter:  aristidb   |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Runtime System
  Version:  7.4.2  |   Keywords:
   Os:  MacOS X|   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+

Comment(by kim):

 As the author of the offending library, I'd like to state that, although I
 have no concrete evidence, I don't actually think it's a GHC bug, but a
 problem with my code, which uses a bunch of rather unsafe operations (it's
 just an experiment, after all). That said, I'd still appreciate any hints
 which may help me in understanding what exactly I might be doing wrong.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7302#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7098: GHC 7.4.1 reports an internal error and core dumps while using DPH

2012-10-14 Thread GHC
#7098: GHC 7.4.1 reports an internal error and core dumps while using DPH
-+--
Reporter:  Prasanna  |   Owner:  benl
Type:  bug   |  Status:  new 
Priority:  normal|   Milestone:  7.8.1   
   Component:  Compiler  | Version:  7.4.1   
Keywords:  DPH   |  Os:  Unknown/Multiple
Architecture:  Unknown/Multiple  | Failure:  None/Unknown
  Difficulty:  Unknown   |Testcase:  
   Blockedby:|Blocking:  
 Related:|  
-+--
Changes (by igloo):

  * milestone:  = 7.8.1


Old description:

 While compiling a DPH program I got the following error,

 Main: internal error: allocGroup: requested zero blocks
 (GHC version 7.4.1 for i386_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 Aborted (core dumped)

 I have attached the code files that I was using.

New description:

 While compiling a DPH program I got the following error,
 {{{
 Main: internal error: allocGroup: requested zero blocks
 (GHC version 7.4.1 for i386_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 Aborted (core dumped)
 }}}
 I have attached the code files that I was using.

--

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7098#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7329: ghc-7.6.1 win64: internal error: R_X86_6 4_PC32: High bits are set in WSAGetLastError

2012-10-14 Thread GHC
#7329: ghc-7.6.1 win64: internal error: R_X86_6 4_PC32: High bits are set in
WSAGetLastError
--+-
 Reporter:  dagit |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.6.1 |   Keywords:  
   Os:  Windows   |   Architecture:  Unknown/Multiple
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-
 While updating cabal-dev to build against ghc-7.6 and cabal 1.16, I got
 the following error during linking:
 {{{
 [ 8 of 19] Compiling Distribution.Dev.CabalInstall (
 src\Distribution\Dev\CabalInstall.hs, dist\build\cabal-dev\cabal-dev-
 tmp\Distribution\Dev\CabalInstall.o )
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... done.
 Loading package array-0.4.0.1 ... linking ... done.
 Loading package deepseq-1.3.0.1 ... linking ... done.
 Loading package bytestring-0.10.0.0 ... linking ... done.
 Loading package zlib-0.5.4.0 ... linking ... done.
 Loading package containers-0.5.0.0 ... linking ... done.
 Loading package pretty-1.1.1.0 ... linking ... done.
 Loading package template-haskell ... linking ... done.
 Loading package Win32-2.3.0.0 ... linking ... done.
 Loading package filepath-1.3.0.1 ... linking ... done.
 Loading package old-locale-1.0.0.5 ... linking ... done.
 Loading package time-1.4.0.1 ... linking ... done.
 Loading package directory-1.2.0.0 ... linking ... done.
 Loading package old-time-1.1.0.1 ... linking ... done.
 Loading package tar-0.4.0.1 ... linking ... done.
 Loading package transformers-0.3.0.0 ... linking ... done.
 Loading package mtl-2.1.2 ... linking ... done.
 Loading package text-0.11.2.3 ... linking ... done.
 Loading package parsec-3.1.3 ... linking ... done.
 Loading package network-2.4.0.1 ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: High bits are set in 7fef1cec8ed for WSAGetLastError
 (GHC version 7.6.1 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.
 Failed to install cabal-dev-0.9.1
 cabal.exe: Error: some packages failed to install:
 cabal-dev-0.9.1 failed during the building phase. The exception was:
 ExitFailure 255
 }}}

 At least on my system this is a reproducible crash. I'm using windows 7,
 64bit with the 64bit GHC.

 {{{
 $ ghc --version
 The Glorious Glasgow Haskell Compilation System, version 7.6.1
 $ cabal --version
 cabal-install version 1.16.0
 using version 1.16.0.1 of the Cabal library
 $ cabal-dev --version
 cabal-dev 0.9
 built with Cabal 1.10.1.0
 }}}

 The command that causes the crash here is to simply run `cabal-dev
 install` on my locally modify source for cabal-dev:
 {{{
 The top commit in my local branch is:
 commit 1a0cadb226b3a0ba65b762172e20e6d2033fc3a3
 Merge: 0c5752b 6db5e32
 Author: Jonathan Daugherty j...@galois.com
 Date:   Wed Jun 27 12:25:02 2012 -0700

 Merge pull request #61 from jonathanjouty/patch-1

 Minor typo in README.md
 }}}

 If you want to try reproducing this, my Git diff looks like this:
 {{{
 diff --git a/cabal-dev.cabal b/cabal-dev.cabal
 index 5c25721..684591a 100644
 --- a/cabal-dev.cabal
 +++ b/cabal-dev.cabal
 @@ -49,7 +49,7 @@ Bug-Reports: http://github.com/creswick/cabal-
 dev/issues
  Copyright:   2010-2012 Galois, Inc.
  Category:Development
  Build-type:  Custom
 -Cabal-version:   =1.6
 +Cabal-version:   =1.14
  Data-Files:
admin/cabal-config.in,
admin/00-index.tar
 @@ -78,6 +78,7 @@ Executable cabal-dev
Main-is: Main.hs
GHC-Options: -Wall
Extensions: TemplateHaskell
 +  default-language: Haskell2010

if flag(no-cabal-dev)
  Buildable: False
 @@ -93,7 +94,7 @@ Executable cabal-dev
  -- avoid using it:
  if impl(ghc = 6.12)
Build-depends:
 -containers = 0.3   0.5
 +containers = 0.3

  -- Require this specific version that came with GHC 6.10 because
  -- of packaging problems with containers-0.2
 @@ -106,18 +107,18 @@ Executable cabal-dev
  containers == 0.1.0.2

  Build-depends:
 -  bytestring = 0.9   0.10,
 -  directory = 1.0   1.3,
 -  filepath = 1.1   1.4,
 -  Cabal = 1.10.0.0   1.15,
 -  HTTP = 4000.0.9   4000.3,
 -  mtl = 1.1   2.2,
 -  network = 2.2   2.4,
 -  pretty = 1.0   1.2,
 -  process = 1.0   1.2,
 -  tar = 0.3   0.4,
 -  zlib = 0.5   0.6,
 -  transformers = 0.2   0.4,
 +  bytestring = 0.9,
 +  directory

Re: [GHC] #7098: GHC 7.4.1 reports an internal error and core dumps while using DPH

2012-10-14 Thread GHC
#7098: GHC 7.4.1 reports an internal error and core dumps while using DPH
-+--
Reporter:  Prasanna  |   Owner:  benl
Type:  bug   |  Status:  new 
Priority:  normal|   Milestone:  7.8.1   
   Component:  Compiler  | Version:  7.4.1   
Keywords:  DPH   |  Os:  Unknown/Multiple
Architecture:  Unknown/Multiple  | Failure:  None/Unknown
  Difficulty:  Unknown   |Testcase:  
   Blockedby:  7330  |Blocking:  
 Related:|  
-+--
Changes (by benl):

  * blockedby:  = 7330


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7098#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-12 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
 Reporter:  heisenbug  |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.7|   Keywords:
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:  yes   
Blockedby: |   Blocking:
  Related: |  
---+
 May be related to #4987, but this time I have a reproducible case.

 So far I found out that the `%INFO_TYPE(%STD_INFO(info))`
 in `stg_ap_v` is 4 (==`CONSTR_2_0`) just before barfing.

 The unsafe cast is just to generalize to the return type,
 but seem to be crucial. When I make `TypedPair` unparametrized
 or remove the TPInt constructor (but remaining a GADT), the crash goes
 away.

 The problem does not happen with GHCi (with this testcase), but I have
 seen the same crash in GHCi too with a more involved code example.

 I compiled vanilla: `ghc internal-error.lhs; ./internal-error`

 I did not test with older compilers.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-12 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
 Reporter:  heisenbug  |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.7|   Keywords:
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:  yes   
Blockedby: |   Blocking:
  Related: |  
---+
Changes (by heisenbug):

 * cc: ggreif@… (added)


Comment:

 I found a pre-7.4 compiler: ghc-7.4.0.20111220
 it emits:
 `internal-error: Impossible case alternative`

 The other compiler did not even typecheck the test case:
 {{{
 ghc-7.5.20120713 internal-error.lhs
 [1 of 1] Compiling Main ( internal-error.lhs, internal-error.o
 )

 internal-error.lhs:39:23:
 Couldn't match type `BL.ByteString'
   with
 `bytestring-0.10.0.0:Data.ByteString.Lazy.Internal.ByteString'
 Expected type: [ByteString]
-
 bytestring-0.10.0.0:Data.ByteString.Lazy.Internal.ByteString
   Actual type: [ByteString] - BL.ByteString
 In the second argument of `(.)', namely `BL.fromChunks'
 In the expression: decode . BL.fromChunks
 In an equation for `decodeAs': decodeAs = decode . BL.fromChunks

 internal-error.lhs:45:41:
 Couldn't match expected type `BL.ByteString'
 with actual type
 `bytestring-0.10.0.0:Data.ByteString.Lazy.Internal.ByteString'
 In the first argument of `BL.toChunks', namely `lazy'
 In the second argument of `($)', namely `BL.toChunks lazy'
 In the expression: decodeAs $ BL.toChunks lazy
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-12 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
 Reporter:  heisenbug  |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.7|   Keywords:
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:  yes   
Blockedby: |   Blocking:
  Related: |  
---+

Comment(by heisenbug):

 This is what gdb has to say:
 {{{
 (gdb) run
 Starting program: /home/ggreif/ReleaseFeatureMatrix/internal-error
 warning: no loadable sections found in added symbol-file system-supplied
 DSO at 0x2aaab000
 [Thread debugging using libthread_db enabled]
 internal-error: internal error: stg_ap_v_ret
 (GHC version 7.7.20121012 for x86_64_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 Program received signal SIGABRT, Aborted.
 0x0035b2a30285 in raise () from /lib64/libc.so.6
 (gdb) bt
 #0  0x0035b2a30285 in raise () from /lib64/libc.so.6
 #1  0x0035b2a31d30 in abort () from /lib64/libc.so.6
 #2  0x2c623799 in rtsFatalInternalErrorFn (s=0x2c660128
 stg_ap_v_ret,
 ap=0x7fff8680) at rts/RtsMessages.c:170
 #3  0x2c623304 in barf (s=0x2c660128 stg_ap_v_ret) at
 rts/RtsMessages.c:42
 #4  0x2c64d7ae in stg_ap_v_info ()
from /home/ggreif/lib/ghc-7.7.20121012/rts-1.0/libHSrts_debug-
 ghc7.7.20121012.so
 #5  0x in ?? ()
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7323#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7323: decoding GADTs gives internal error: stg_ap_v_ret

2012-10-12 Thread GHC
#7323: decoding GADTs gives internal error: stg_ap_v_ret
---+
 Reporter:  heisenbug  |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.7|   Keywords:
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:  yes   
Blockedby: |   Blocking:
  Related: |  
---+

Comment(by heisenbug):

 Debug session on OS X (i386)

 {{{
 Breakpoint 1, 0x003bfe68 in stg_ap_v_info ()
 (gdb) info reg
 eax0x2808   10248 info table:
 Main_TPString_con_info
 ecx0x4  4 INFO TYPE (dito)
 edx0xd00040 13631552
 ebx0x425f4c 4349772
 esp0xbfffd87c   0xbfffd87c
 ebp0xd033ac 0xd033ac
 esi0xd058f8 13654264
 edi0xd05900 13654272
 eip0x3bfe68 0x3bfe68 stg_ap_v_info+676
 eflags 0x202514
 cs 0x1b 27
 ss 0x23 35
 ds 0x23 35
 es 0x23 35
 fs 0x0  0
 gs 0xf  15
 (gdb) x/20x $eax-4
 0x2804 Main_TPString_con_info_dsp+8:  0x00010004  0xff02c683
 0x000c0065  0x9066
 0x2814 Main_TPString_static_info_dsp: 0x003c216c  0x0002
 0x00010007  0xff02c683
 0x2824 Main_TPString_static_info+4:   0x000c0065  0x8955
 0xec8353e5  0xe834
 0x2834 main+10:   0x8d5b  0x3e380283  0x8b008b00
 0x008b0450
 0x2844 main+26:   0x89f04589  0x45c7f455  0x02f0
 0xf0458b00
 (gdb) x/20x $eax
 0x2808 Main_TPString_con_info:0xff02c683  0x000c0065
 0x9066  0x003c216c
 0x2818 Main_TPString_static_info_dsp+4:   0x0002  0x00010007
 0xff02c683  0x000c0065
 0x2828 Main_TPString_static_info+8:   0x8955  0xec8353e5
 0xe834  0x8d5b
 0x2838 main+14:   0x3e380283  0x8b008b00  0x008b0450
 0x89f04589
 0x2848 main+30:   0x45c7f455  0x02f0  0xf0458b00
 0x89f4558b
 (gdb) p *(short*)0x2804
 $1 = 4
 }}}

 It loads the address `Main_TPString_con_info` at this code position:
 `Main_zdWTPString_info+0x14`

 {{{
 _Main_zdWTPString_info_dsp:
 0044orb $_Main_zdWTPInt_info_dsp,%al
 0046addb(%eax),%al
 0048addb%al,(%eax)
 004aaddb%al,(%eax)
 004csldt(%eax)
 004faddb%al,0x7b3b0cc7(%ebx)
 0055popl%esp
 0056ja  0x0073
 0058movl$_Main_TPString_con_info,0xf8(%edi)
 
 005fmovl_Main_zdWTPInt_info_dsp(%ebp),%eax
 0062movl%eax,0xfc(%edi)
 0065movl0x04(%ebp),%eax
 0068movl%eax,(%edi)
 006aleal0xfa(%edi),%esi
 006daddl$0x08,%ebp
 0070jmp *_Main_zdWTPInt_info_dsp(%ebp) calls
 stg_upd_frame_info
 0073movl$_Main_zdWTPInt_info,0x74(%ebx)
 007amovl$_Main_zdWTPString_closure,%esi
 007fjmp *0xfc(%ebx)
 0082orb $_Main_zdWTPInt_info_dsp,%al
 0084addb%al,(%eax)
 0086nop
 }}}

 {{{
 0x003bfa18 stg_upd_frame_info+0:  mov0x4(%ebp),%eax
 0x003bfa1b stg_upd_frame_info+3:  add$0x8,%ebp
 0x003bfa1e stg_upd_frame_info+6:  sub$0x8,%esp
 0x003bfa21 stg_upd_frame_info+9:  push   %eax
 0x003bfa22 stg_upd_frame_info+10: mov%eax,0x4c(%esp)
 0x003bfa26 stg_upd_frame_info+14: call   0x3892d5
 overwritingClosure   overwritingClosure (p=0xd058e8) at
 ClosureMacros.h:474

 0x003bfa2b stg_upd_frame_info+19: add$0xc,%esp
 0x003bfa2e stg_upd_frame_info+22: mov0x40(%esp),%eax
 0x003bfa32 stg_upd_frame_info+26: mov%esi,0x4(%eax)
 0x003bfa35 stg_upd_frame_info+29: mov0x3e63d8,%ecx
 0x003bfa3b stg_upd_frame_info+35: mov%ecx,(%eax)
 0x003bfa3d stg_upd_frame_info+37: mov%eax,%ecx
 0x003bfa3f stg_upd_frame_info+39: and$0xfff0,%ecx
 0x003bfa45 stg_upd_frame_info+45: mov%eax,%edx
 0x003bfa47 stg_upd_frame_info+47: and$0xff000,%edx
 0x003bfa4d stg_upd_frame_info+53: shr$0x7,%edx
 0x003bfa50 stg_upd_frame_info+56: or %ecx,%edx
 0x003bfa52 stg_upd_frame_info+58: cmpw   $0x0,0x14(%edx)
 0x003bfa57 stg_upd_frame_info+63: jne0x3bfa5c
 stg_upd_frame_info+68
 0x003bfa59 stg_upd_frame_info+65: jmp*0x0(%ebp) 
 stg_marked_upd_frame_info
 0x003bfa5c stg_upd_frame_info+68: movswl 0x14(%edx),%ecx
 0x003bfa60 stg_upd_frame_info+72: shl$0x2,%ecx
 0x003bfa63 stg_upd_frame_info+75: mov0x9c(%ebx),%edx
 0x003bfa69 stg_upd_frame_info+81: add

Re: [GHC] #7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type 66562

2012-10-09 Thread GHC
#7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type
66562
---+
 Reporter:  aristidb   |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Runtime System
  Version:  7.4.2  |   Keywords:
   Os:  MacOS X|   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+

Comment(by aristidb):

 I get the same error under x86_64 Linux (GHC 7.4.2, too).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7302#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-07 Thread GHC
#7301: Got an internal error that caused GHCi to crash
---+
Reporter:  guest   |   Owner:
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:
   Component:  GHCi| Version:  7.4.1 
Keywords:  |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Changes (by igloo):

  * owner:  guest =
  * difficulty:  = Unknown


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-07 Thread GHC
#7301: Got an internal error that caused GHCi to crash
-+--
  Reporter:  guest   |  Owner:
  Type:  bug | Status:  closed
  Priority:  normal  |  Milestone:
 Component:  GHCi|Version:  7.4.1 
Resolution:  worksforme  |   Keywords:
Os:  Windows |   Architecture:  x86_64 (amd64)
   Failure:  GHCi crash  | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by igloo):

  * status:  new = closed
  * resolution:  = worksforme


Comment:

 If this isn't repeatable then there's not much we can do, I'm afraid.

 If you find a way to reproduce it, please reopen or file a new ticket.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:6
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type 66562

2012-10-07 Thread GHC
#7302: perf-disruptor2-multicast: internal error: evacuate: strange closure type
66562
---+
 Reporter:  aristidb   |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Runtime System
  Version:  7.4.2  |   Keywords:
   Os:  MacOS X|   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+
 When running the benchmarks for data-ringbuffer (https://github.com/kim
 /data-ringbuffer), I get the following error:

 Benchmark perf-disruptor2-multicast: RUNNING...
 perf-disruptor2-multicast: internal error: evacuate: strange closure type
 66562
 (GHC version 7.4.2 for x86_64_apple_darwin)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 Benchmark perf-disruptor2-multicast: ERROR


 I use GHC 7.4.2 (64-bit) on OS X 10.7.5. I don't know what is going on at
 all, because data-ringbuffer is not my own code. However, the GHC runtime
 asked me to report this.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7302
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-06 Thread GHC
#7301: Got an internal error that caused GHCi to crash
+---
 Reporter:  guest   |  Owner:  guest 
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  GHCi  
  Version:  7.4.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---

Comment(by guest):

 Can you try with GHC 7.6? Windows 64 bit had rather weak support in GHC
 7.4.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-05 Thread GHC
#7301: Got an internal error that caused GHCi to crash
+---
 Reporter:  guest   |  Owner:
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  Runtime System
  Version:  7.4.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
 Here's the error message:

 interactive: internal error: evacuate: strange closure type 18317
 (GHC version 7.4.1 for i386_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.



 This happened while :load-ing a file.  GHCi had been running for quite a
 while.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-05 Thread GHC
#7301: Got an internal error that caused GHCi to crash
+---
 Reporter:  guest   |  Owner:
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  GHCi  
  Version:  7.4.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
Changes (by guest):

  * component:  Runtime System = GHCi


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-05 Thread GHC
#7301: Got an internal error that caused GHCi to crash
+---
 Reporter:  guest   |  Owner:  sim   
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  GHCi  
  Version:  7.4.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
Changes (by guest):

  * owner:  = sim


Comment:

 Forgot to add that this is not a recurring problem.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7301: Got an internal error that caused GHCi to crash

2012-10-05 Thread GHC
#7301: Got an internal error that caused GHCi to crash
+---
 Reporter:  guest   |  Owner:  guest 
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  GHCi  
  Version:  7.4.1   |   Keywords:
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
Changes (by guest):

  * owner:  sim = guest


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7301#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7209: haddock fails with internal error: spliceURL UnhelpfulSpan

2012-08-31 Thread GHC
#7209: haddock fails with internal error: spliceURL UnhelpfulSpan
--+-
 Reporter:  valiron   |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Documentation   
  Version:  7.4.2 |   Keywords:  
   Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
  Failure:  Runtime crash |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-
 This bug has already been submitted on the haddock trac system.

 http://trac.haskell.org/haddock/ticket/207

 I am reflecting it here as the bug is still valid as of the haddock
 version 2.11.0 included in ghc 7.4.2.

 Symptom: if a declaration is missing a type signature, as in
 {{{
 module HaddockBug (
   haddockbug
   ) where

 -- missing type signature
 haddockbug x = x + 1
 }}}

 haddock called with the command line

 {{{
 haddock -h HaddockBug.hs --source-entity=HaddockBug.html#line-%L
 }}}

 fails with

 {{{
 internal error: spliceURL UnhelpfulSpan
 }}}




 In case it is of any help, here is the patch I am using to overcome the
 problem.

 {{{
 diff -r -u haddock-ghc-7.4.2/src/Haddock/Interface/Create.hs
 haddock/src/Haddock/Interface/Create.hs
 --- haddock-ghc-7.4.2/src/Haddock/Interface/Create.hs   2012-08-30
 10:12:42.149210546 -0400
 +++ haddock/src/Haddock/Interface/Create.hs 2012-08-30
 10:13:08.745620048 -0400
 @@ -19,6 +19,7 @@
  import Haddock.Utils
  import Haddock.Convert
  import Haddock.Interface.LexParseRn
 +import Haddock.Interface.Rename

  import qualified Data.Map as M
  import Data.Map (Map)
 @@ -41,6 +42,25 @@
  import TcRnTypes
  import FastString (unpackFS)

 +-- | To filter out the ExportItem's that are UnhelpfulSpan.
 +isHelpfulSpan :: ExportItem Name - ErrMsgM Bool
 +isHelpfulSpan l = case l of
 + (ExportDecl (L (UnhelpfulSpan _) _) _ _ _) - do
 +   tell [concat [Warning: ,
 + extractName l,
 +  is exported but does not have a type signature. ,
 + Skipping it...]]
 +   return False
 + _ - return True
 +  where
 +
 +  -- This is reusing renameExportItem and runRnFM from
 +  -- Haddock.Interface.Rename.
 +  --
 +  -- We use an empty environment for simplicity: for the sake
 +  -- of the warning, we know in which module this takes place.
 +  extractName :: ExportItem Name - String
 +  extractName e = show $ getOccString $ head $ snd $ runRnFM M.empty $
 renameExportItem e

  -- | Use a 'TypecheckedModule' to produce an 'Interface'.
  -- To do this, we need access to already processed modules in the
 topological
 @@ -91,6 +111,7 @@
let warningMap = mkWarningMap warnings gre exportedNames
exportItems - mkExportItems modMap mdl warningMap gre exportedNames
 decls maps exports
 instances instIfaceMap dflags
 + = (liftErrMsg . filterM isHelpfulSpan)

let visibleNames = mkVisibleNames exportItems opts

 diff -r -u haddock-ghc-7.4.2/src/Haddock/Interface/Rename.hs
 haddock/src/Haddock/Interface/Rename.hs
 --- haddock-ghc-7.4.2/src/Haddock/Interface/Rename.hs   2012-08-30
 10:12:42.149210546 -0400
 +++ haddock/src/Haddock/Interface/Rename.hs 2012-08-29
 17:12:47.812702645 -0400
 @@ -9,7 +9,7 @@
  -- Stability   :  experimental
  -- Portability :  portable
 -
 -module Haddock.Interface.Rename (renameInterface) where
 +module Haddock.Interface.Rename
 (renameInterface,renameExportItem,runRnFM) where


  import Haddock.GhcUtils
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7209
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7132: Internal error: stg_ap_v_ret when running indexed_types tests

2012-08-21 Thread GHC
#7132: Internal error: stg_ap_v_ret when running indexed_types tests
---+
Reporter:  goldfire|   Owner:  simonmar
Type:  bug |  Status:  new 
Priority:  highest |   Milestone:  7.8.1   
   Component:  Compiler| Version:  7.5 
Keywords:  |  Os:  MacOS X 
Architecture:  x86_64 (amd64)  | Failure:  None/Unknown
  Difficulty:  Unknown |Testcase:  
   Blockedby:  |Blocking:  
 Related:  |  
---+
Changes (by simonmar):

  * owner:  = simonmar
  * difficulty:  = Unknown
  * priority:  normal = highest
  * milestone:  = 7.8.1


Comment:

 I think I may have broken the LLVM backend somehow.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7132#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-08-21 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:
Type:  bug |  Status:  new   
Priority:  highest |   Milestone:  7.6.2 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Changes (by simonmar):

  * milestone:  7.8.1 = 7.6.2


Comment:

 Given that it appears to kill GHCi completely on this platform, I think
 7.6.2 would be a better milestone.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7132: Internal error: stg_ap_v_ret when running indexed_types tests

2012-08-21 Thread GHC
#7132: Internal error: stg_ap_v_ret when running indexed_types tests
---+
  Reporter:  goldfire  |  Owner:  simonmar  
  Type:  bug   | Status:  closed
  Priority:  highest   |  Milestone:  7.8.1 
 Component:  Compiler  |Version:  7.5   
Resolution:  fixed |   Keywords:
Os:  MacOS X   |   Architecture:  x86_64 (amd64)
   Failure:  None/Unknown  | Difficulty:  Unknown   
  Testcase:|  Blockedby:
  Blocking:|Related:
---+
Changes (by simonmar):

  * status:  new = closed
  * resolution:  = fixed


Comment:

 Fixed:

 commit d4ac7d8160b3533c7d0a2377b5442038f69486a8
 {{{
 Author: Simon Marlow marlo...@gmail.com
 Date:   Tue Aug 21 12:48:34 2012 +0100

 Fix inverted test for platformUnregisterised (should fix the optllvm
 breakage)
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7132#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-08-13 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:  7.6.1 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Changes (by pcapriotti):

  * difficulty:  = Unknown
  * version:  = 7.6.1-rc1
  * milestone:  = 7.6.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-08-13 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:
Type:  bug |  Status:  new   
Priority:  normal  |   Milestone:  7.6.1 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+

Comment(by pcapriotti):

 Thanks for the report.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-08-13 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
---+
Reporter:  cetinsert   |   Owner:
Type:  bug |  Status:  new   
Priority:  highest |   Milestone:  7.8.1 
   Component:  GHCi| Version:  7.6.1-rc1 
Keywords:  R_X86_64_PC32   |  Os:  Windows   
Architecture:  x86_64 (amd64)  | Failure:  GHCi crash
  Difficulty:  Unknown |Testcase:
   Blockedby:  |Blocking:
 Related:  |  
---+
Changes (by igloo):

  * priority:  normal = highest
  * milestone:  7.6.1 = 7.8.1


Comment:

 This works for me, on Windows 7 64bit.

 As it only affects ghci, probably only on Windows 8, and isn't a
 regression (as Win64 wasn't supported at all before) I've milestoned it
 for 7.8.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #7098: GHC 7.4.1 reports an internal error and core dumps while using DPH

2012-08-13 Thread GHC
#7098: GHC 7.4.1 reports an internal error and core dumps while using DPH
-+--
Reporter:  Prasanna  |   Owner:  benl
Type:  bug   |  Status:  new 
Priority:  normal|   Milestone:  
   Component:  Compiler  | Version:  7.4.1   
Keywords:  DPH   |  Os:  Unknown/Multiple
Architecture:  Unknown/Multiple  | Failure:  None/Unknown
  Difficulty:  Unknown   |Testcase:  
   Blockedby:|Blocking:  
 Related:|  
-+--
Changes (by simonpj):

  * owner:  = benl
  * difficulty:  = Unknown


Comment:

 Ben, might you look at this?

 Simon

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7098#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32

2012-08-12 Thread GHC
#7134: ghc-7.6.0.20120810-x86_64-windows.exe - internal error R_X86_64_PC32
+---
 Reporter:  cetinsert   |  Owner:
 Type:  bug | Status:  new   
 Priority:  normal  |  Component:  GHCi  
  Version:  |   Keywords:  R_X86_64_PC32 
   Os:  Windows |   Architecture:  x86_64 (amd64)
  Failure:  GHCi crash  |   Testcase:
Blockedby:  |   Blocking:
  Related:  |  
+---
 I downloaded ghc-7.6.0.20120810-x86_64-windows.exe and attempting to run
 GHCi dumps the following error message:

 {{{
 C:\Users\Cetinghci
 GHCi, version 7.6.0.20120810: http://www.haskell.org/ghc/  :? for help
 Loading package ghc-prim ... linking ... done.
 Loading package integer-gmp ... linking ... done.
 Loading package base ... linking ... ghc.exe: internal error:
 R_X86_64_PC32: Hig
 h bits are set in 7f9585f95a0 for WaitForSingleObject
 (GHC version 7.6.0.20120810 for x86_64_unknown_mingw32)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

 This application has requested the Runtime to terminate it in an unusual
 way.
 Please contact the application's support team for more information.

 }}}

 Tested on Windows 8 Release Preview 64-bit.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/7134
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2012-08-09 Thread GHC
#5085: internal error: evacuate: strange closure type
-+--
  Reporter:  mitar   |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  highest |  Milestone:  7.4.1 
 Component:  Runtime System  |Version:  7.1   
Resolution:  wontfix |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * difficulty:  = Unknown


Comment:

 Thanks for the update.  It sounds like perhaps there's an underlying bug
 that is manifesting in a different way now.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:18
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2012-08-08 Thread GHC
#5085: internal error: evacuate: strange closure type
-+--
  Reporter:  mitar   |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  highest |  Milestone:  7.4.1 
 Component:  Runtime System  |Version:  7.1   
Resolution:  wontfix |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--

Comment(by mitar):

 That's interesting. I tried to reproduce this on a virtual machine running
 Linux and I tried 7.0.4, 7.2.2 and 7.4.1 and I cannot reproduce it
 anymore. It is true that I kept the same Haskell platform (2012.2) for all
 tests. That is probably a good thing.

 But what is even more interesting is that my algorithm does not work
 correctly on 7.2.2 and 7.4.1 anymore! It is a message-passing shortest-
 path searching algorithm which incrementally updates states of each node
 as it discovers better and better paths. And when it finds a better node,
 it informs all the neighbors about that which might also improve their
 list of best paths. And this is repeated. Every node is a Haskell spark,
 edges, too. So I really create a lot of sparks. At least around 6 of
 them for `-s 400`. :-)

 And on 7.0.4 algorithm works. When messages stop being passed around, all
 shortest paths are found. But on 7.2.2 and 7.4.1 this is not so. Again and
 again only around 91% paths are found and then messages stop and program
 finishes because of this, but not all paths are found.

 I am not working on this project anymore so I also don't have time or
 motivation to really debug it. I just wanted to publish my findings. So
 something is different between 7.0 and 7.2+ versions. Maybe there is a bug
 in my code which was not visible before. Maybe some API semantic changed
 just slightly, so that GHC sill compiles, but behavior is changed. I don't
 know. And it is too complex and stochastic to easy debug it. But of
 course, this is also why it is a good example of a complex program which
 really pushes GHC and its runtime to limits.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:17
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-07-31 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:
  Type:  bug | Status:  new   
  Priority:  normal  |  Milestone:  7.6.1 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * status:  closed = new
  * resolution:  fixed =


Comment:

 No, it started working as a side-effect of

 commit 5ba7db93fb634ff8094f42780a14972322446a94
 {{{
 Author: Paolo Capriotti p.caprio...@gmail.com
 Date:   Tue Mar 20 11:57:28 2012 +

 Use monotonic clock in Select.c (#5865)
 }}}

 but the bug still exists.  I have a fix on the way...

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-07-31 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:  simonmar  
  Type:  bug | Status:  new   
  Priority:  normal  |  Milestone:  7.6.1 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * owner:  = simonmar


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-07-31 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  normal  |  Milestone:  7.6.1 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  fixed   |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  rts/7087|  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * status:  new = closed
  * testcase:  = rts/7087
  * resolution:  = fixed


Comment:

 Fixed:

 commit 598ee1ad1b8de089a2ed207543761d617a90db52
 {{{
 Author: Simon Marlow marlo...@gmail.com
 Date:   Tue Jul 31 09:06:43 2012 +0100

 Fix #7087 (integer overflow in getDelayTarget())

  includes/Rts.h |2 ++
  rts/posix/Select.c |   15 ---
  2 files changed, 14 insertions(+), 3 deletions(-)
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #6152: Type synonym for Type family + DataKinds won't recompile due to internal error

2012-06-08 Thread GHC
#6152: Type synonym for Type family + DataKinds won't recompile due to internal
error
---+
 Reporter:  konn   |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.4.1  |   Keywords:
   Os:  MacOS X|   Architecture:  x86_64 (amd64)
  Failure:  GHC rejects valid program  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+
 I have following program:
 {{{
 {-# LANGUAGE DataKinds, TypeFamilies, GADTs #-}
 module Main where

 data U = Unit

 data SU (a :: U) where
   SInt :: SU Unit

 type family I (a :: U) :: U
 type instance I Unit = Unit

 type SUI a = SU (I a)

 main :: IO ()
 main = return ()
 }}}

 This program compiles successfully, but won't recompile due to an internal
 error.

 {{{
 $ ghc WontCompile.hs
 [1 of 1] Compiling Main ( WontCompile.hs, WontCompile.o )
 Linking WontCompile ...

 $ ghc WontCompile.hs -fforce-recomp
 [1 of 1] Compiling Main ( WontCompile.hs, WontCompile.o )

 WontCompile.hs:12:18:
 GHC internal error: `I' is not in scope during type checking, but it
 passed the renamer
 tcl_env of environment: [(a9O, AThing k_a9X)]
 In the type `SU (I a)'
 In the type synonym declaration for `SUI'
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6152
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6152: Type synonym for Type family + DataKinds won't recompile due to internal error

2012-06-08 Thread GHC
#6152: Type synonym for Type family + DataKinds won't recompile due to internal
error
-+--
  Reporter:  konn|  Owner:  
  
  Type:  bug | Status:  closed  
  
  Priority:  normal  |  Milestone:  
  
 Component:  Compiler|Version:  7.4.1   
  
Resolution:  fixed   |   Keywords:  
  
Os:  MacOS X |   Architecture:  x86_64 
(amd64)
   Failure:  GHC rejects valid program   | Difficulty:  Unknown 
  
  Testcase:  indexed_types/should_compile/T6152  |  Blockedby:  
  
  Blocking:  |Related:  
  
-+--
Changes (by simonpj):

  * status:  new = closed
  * difficulty:  = Unknown
  * resolution:  = fixed
  * testcase:  = indexed_types/should_compile/T6152


Comment:

 Thanks. Happily, already fixed in HEAD.  I added a regression test.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6152#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-04-19 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
-+--
  Reporter:  shahn   |  Owner:
  Type:  bug | Status:  closed
  Priority:  normal  |  Milestone:  7.6.1 
 Component:  Runtime System  |Version:  7.4.1 
Resolution:  fixed   |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:  Unknown   
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by pcapriotti):

  * status:  new = closed
  * difficulty:  = Unknown
  * resolution:  = fixed
  * milestone:  = 7.6.1


Comment:

 Thanks for the report. Cannot reproduce on the HEAD. I presume it's fixed
 by the recent `threadDelay` changes in the non-threaded RTS
 (9d26519c20194abc3832578a55fbe31327519eeb).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #6019: 'threadDelay maxBound' results in 'internal error: select failed'

2012-04-18 Thread GHC
#6019: 'threadDelay maxBound' results in 'internal error: select failed'
---+
 Reporter:  shahn  |  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Runtime System
  Version:  7.4.1  |   Keywords:
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related: |  
---+
 When compiling and running this program:

 {{{
 import Control.Concurrent

 main = threadDelay maxBound
 }}}
 , I get a crash and the following error message:
 {{{
 select: Invalid argument
 threadDelayMaxBound: internal error: select failed
 (GHC version 7.4.1 for x86_64_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 }}}
 . This doesn't happen in ghci. I compiled with 'ghc FILE.hs'.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/6019
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5898: ghc: internal error: Invalid Mach-O file

2012-03-15 Thread GHC
#5898: ghc: internal error: Invalid Mach-O file
--+-
 Reporter:  jeffshaw  |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.0.4 |   Keywords:  
   Os:  MacOS X   |   Architecture:  powerpc 
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-

Comment(by jeffshaw):

 I show the same version numbers. Perhaps I can install newer versions of
 these programs from macports and try again?

 $ as -v
 Apple Inc version cctools-698.1~1, GNU assembler version 1.38
 ^CInterrupted by signal 2

 $ ld -v
 @(#)PROGRAM:ld  PROJECT:ld64-85.2.1
 $ uname -a
 Darwin PowerBook.local 9.8.0 Darwin Kernel Version 9.8.0: Wed Jul 15 16:57
 :0Jeffrey-Shaws-P1 PDT 2009; root:xnu-1228.15.4~1/RELEASE_PPC Power
 Macintosh

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5898#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5898: ghc: internal error: Invalid Mach-O file

2012-03-09 Thread GHC
#5898: ghc: internal error: Invalid Mach-O file
--+-
 Reporter:  jeffshaw  |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.0.4 |   Keywords:  
   Os:  MacOS X   |   Architecture:  powerpc 
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-

Comment(by PHO):

 jeffshaw, which version of cctools are you using? Mine is:
 {{{
 % as -v
 Apple Inc version cctools-698.1~1, GNU assembler version 1.38
 % ld -v
 @(#)PROGRAM:ld  PROJECT:ld64-85.2.1
 % uname -a
 Darwin aria.cielonegro.org 9.8.0 Darwin Kernel Version 9.8.0: Wed Jul 15
 16:57:01 PDT 2009; root:xnu-1228.15.4~1/RELEASE_PPC Power Macintosh
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5898#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5898: ghc: internal error: Invalid Mach-O file

2012-03-06 Thread GHC
#5898: ghc: internal error: Invalid Mach-O file
--+-
 Reporter:  jeffshaw  |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.0.4 |   Keywords:  
   Os:  MacOS X   |   Architecture:  powerpc 
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-
Changes (by PHO):

 * cc: pho@… (added)


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5898#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5898: ghc: internal error: Invalid Mach-O file

2012-02-26 Thread GHC
#5898: ghc: internal error: Invalid Mach-O file
--+-
 Reporter:  jeffshaw  |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.0.4 |   Keywords:  
   Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-
 I am running Mac OS 10.5.8 on a PowerPC processor.

 $ cabal --version
 cabal-install version 0.10.2
 using version 1.10.2.0 of the Cabal library
 $ ghc --version
 The Glorious Glasgow Haskell Compilation System, version 7.0.4
 $ machine
 ppc7450

 cabal install yesod-core fails with

 Loading package wai-logger-0.1.4 ... linking ... ghc: internal error:
 Invalid Mach-O file:Address out of bounds while relocating object file
 (GHC version 7.0.4 for powerpc_apple_darwin)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5898
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5898: ghc: internal error: Invalid Mach-O file

2012-02-26 Thread GHC
#5898: ghc: internal error: Invalid Mach-O file
--+-
 Reporter:  jeffshaw  |  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Component:  Compiler
  Version:  7.0.4 |   Keywords:  
   Os:  MacOS X   |   Architecture:  powerpc 
  Failure:  None/Unknown  |   Testcase:  
Blockedby:|   Blocking:  
  Related:|  
--+-
Changes (by jeffshaw):

  * os:  Unknown/Multiple = MacOS X
  * architecture:  Unknown/Multiple = powerpc


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5898#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5792: PolyKinds and recompilation causes internal error

2012-02-06 Thread GHC
#5792: PolyKinds and recompilation causes internal error
-+--
  Reporter:  reinerp |  Owner:  simonpj 
  Type:  bug | Status:  closed  
  Priority:  high|  Milestone:  7.4.2   
 Component:  Compiler (Type checker) |Version:  7.4.1-rc1   
Resolution:  fixed   |   Keywords:  PolyKinds   
Os:  Unknown/Multiple|   Architecture:  Unknown/Multiple
   Failure:  Compile-time crash  | Difficulty:  Unknown 
  Testcase:  typecheck/should_compile/T5792  |  Blockedby:  
  Blocking:  |Related:  
-+--
Changes (by simonpj):

  * status:  new = closed
  * testcase:  = typecheck/should_compile/T5792
  * resolution:  = fixed


Comment:

 And I fixed the HEAD thus:
 {{{
 commit f92591defcb5c4803c301558d51e3f8c9c92a985
 Author: Simon Peyton Jones simo...@microsoft.com
 Date:   Mon Feb 6 08:38:59 2012 +

 Refactor HsDecls again, to put family instances in InstDecl

 This continues the clean up of the front end.  Since they
 were first invented, type and data family *instance* decls
 have been in the TyClDecl data type, even though they always
 treated separately.

 This patch takes a step in the right direction
   * The InstDecl type now includes both class instances and
 type/data family instances

   * The hs_tyclds field of HsGroup now never has any family
 instance declarations in it

 However a family instance is still a TyClDecl.  It should really
 be a separate type, but that's the next step.

 All this was provoked by fixing Trac #5792 in the HEAD.
 (I did a less invasive fix on the branch.)

  compiler/deSugar/DsMeta.hs  |   16 ++---
  compiler/hsSyn/Convert.lhs  |   20 ++-
  compiler/hsSyn/HsDecls.lhs  |   61
 +++
  compiler/hsSyn/HsUtils.lhs  |   24 --
  compiler/main/HscStats.lhs  |   13 ---
  compiler/parser/Parser.y.pp |   33 +++
  compiler/rename/RnNames.lhs |   29 
  compiler/rename/RnSource.lhs|   23 +
  compiler/typecheck/TcDeriv.lhs  |2 +-
  compiler/typecheck/TcInstDcls.lhs   |   35 ++--
  compiler/typecheck/TcTyClsDecls.lhs |   11 ++
  utils/ghctags/Main.hs   |2 +-
  12 files changed, 156 insertions(+), 113 deletions(-)
 }}}
 Plus a regression test.  Done!

 Simon

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5792: PolyKinds and recompilation causes internal error

2012-02-02 Thread GHC
#5792: PolyKinds and recompilation causes internal error
+---
Reporter:  reinerp  |   Owner:  simonpj   
Type:  bug  |  Status:  new   
Priority:  high |   Milestone:  7.4.2 
   Component:  Compiler (Type checker)  | Version:  7.4.1-rc1 
Keywords:  PolyKinds|  Os:  Unknown/Multiple  
Architecture:  Unknown/Multiple | Failure:  Compile-time crash
  Difficulty:  Unknown  |Testcase:
   Blockedby:   |Blocking:
 Related:   |  
+---

Comment(by simonpj):

 I've fixed the 7.4 branch, thus:
 {{{
 commit bd0ce7d72a62100157355e3bab50bee3c953ee62
 Author: Simon Peyton Jones simo...@microsoft.com
 Date:   Thu Feb 2 13:21:46 2012 +

 Fix dependency-analysis of type/class decls

 Family instances don't define a new type, but we were bogusly
 pretending they bound the family tycon.  The led to incorrect
 dependencies with strange results; it showed up as Trac #5792.

 This slightly hacky fix is on the branch only; I am doing a more
 substantial refactoring on HEAD.

  compiler/rename/RnSource.lhs |   16 
  1 files changed, 12 insertions(+), 4 deletions(-)
 }}}
 I'll make a separate fix for HEAD.

 Simon

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5792: PolyKinds and recompilation causes internal error

2012-02-01 Thread GHC
#5792: PolyKinds and recompilation causes internal error
+---
Reporter:  reinerp  |   Owner:
Type:  bug  |  Status:  new   
Priority:  high |   Milestone:  7.4.2 
   Component:  Compiler (Type checker)  | Version:  7.4.1-rc1 
Keywords:  PolyKinds|  Os:  Unknown/Multiple  
Architecture:  Unknown/Multiple | Failure:  Compile-time crash
  Difficulty:  Unknown  |Testcase:
   Blockedby:   |Blocking:
 Related:   |  
+---
Changes (by igloo):

  * priority:  normal = high
  * difficulty:  = Unknown
  * os:  MacOS X = Unknown/Multiple
  * milestone:  = 7.4.2


Comment:

 Reproducible in HEAD and 7.4 branch.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5792: PolyKinds and recompilation causes internal error

2012-02-01 Thread GHC
#5792: PolyKinds and recompilation causes internal error
+---
Reporter:  reinerp  |   Owner:  simonpj   
Type:  bug  |  Status:  new   
Priority:  high |   Milestone:  7.4.2 
   Component:  Compiler (Type checker)  | Version:  7.4.1-rc1 
Keywords:  PolyKinds|  Os:  Unknown/Multiple  
Architecture:  Unknown/Multiple | Failure:  Compile-time crash
  Difficulty:  Unknown  |Testcase:
   Blockedby:   |Blocking:
 Related:   |  
+---
Changes (by simonpj):

  * owner:  = simonpj


Comment:

 I know what is going on here.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5799: internal error: evacuate: strange closure type 15

2012-01-23 Thread GHC
#5799: internal error: evacuate: strange closure type 15
-+--
Reporter:  vl.still  |   Owner:
Type:  bug   |  Status:  infoneeded
Priority:  normal|   Milestone:
   Component:  GHCi  | Version:  7.2.2 
Keywords:|  Os:  Windows   
Architecture:  x86   | Failure:  GHCi crash
  Difficulty:  Unknown   |Testcase:
   Blockedby:|Blocking:
 Related:|  
-+--
Changes (by simonmar):

  * status:  new = infoneeded


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5799#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5799: internal error: evacuate: strange closure type 15

2012-01-23 Thread GHC
#5799: internal error: evacuate: strange closure type 15
-+--
Reporter:  vl.still  |   Owner:
Type:  bug   |  Status:  infoneeded
Priority:  normal|   Milestone:
   Component:  GHCi  | Version:  7.2.2 
Keywords:|  Os:  Windows   
Architecture:  x86   | Failure:  GHCi crash
  Difficulty:  Unknown   |Testcase:
   Blockedby:|Blocking:
 Related:|  
-+--

Comment(by vl.still):

 Replying to [comment:1 simonmar]:
  Can you reproduce the problem?

 Unfortunately I was unable to reproduce the problem. I tried repeating
 same steps as in crash case but it runs OK now.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5799#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5799: internal error: evacuate: strange closure type 15

2012-01-23 Thread GHC
#5799: internal error: evacuate: strange closure type 15
-+--
  Reporter:  vl.still|  Owner: 
  Type:  bug | Status:  closed 
  Priority:  normal  |  Milestone: 
 Component:  GHCi|Version:  7.2.2  
Resolution:  worksforme  |   Keywords: 
Os:  Windows |   Architecture:  x86
   Failure:  GHCi crash  | Difficulty:  Unknown
  Testcase:  |  Blockedby: 
  Blocking:  |Related: 
-+--
Changes (by simonmar):

  * status:  infoneeded = closed
  * resolution:  = worksforme


Comment:

 Probably a transient hardware problem then.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5799#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5799: internal error: evacuate: strange closure type 15

2012-01-20 Thread GHC
#5799: internal error: evacuate: strange closure type 15
-+--
Reporter:  vl.still  |   Owner:
Type:  bug   |  Status:  new   
Priority:  normal|   Milestone:
   Component:  GHCi  | Version:  7.2.2 
Keywords:|  Os:  Windows   
Architecture:  x86   | Failure:  GHCi crash
  Difficulty:  Unknown   |Testcase:
   Blockedby:|Blocking:
 Related:|  
-+--
Changes (by simonmar):

  * difficulty:  = Unknown


Comment:

 Can you reproduce the problem?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5799#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5792: PolyKinds and recompilation causes internal error

2012-01-18 Thread GHC
#5792: PolyKinds and recompilation causes internal error
+---
 Reporter:  reinerp |  Owner: 
 Type:  bug | Status:  new
 Priority:  normal  |  Component:  Compiler (Type checker)
  Version:  7.4.1-rc1   |   Keywords:  PolyKinds  
   Os:  MacOS X |   Architecture:  Unknown/Multiple   
  Failure:  Compile-time crash  |   Testcase: 
Blockedby:  |   Blocking: 
  Related:  |  
+---
Changes (by dreixel):

  * keywords:  = PolyKinds


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5792: PolyKinds and recompilation causes internal error

2012-01-17 Thread GHC
#5792: PolyKinds and recompilation causes internal error
+---
 Reporter:  reinerp |  Owner: 
 Type:  bug | Status:  new
 Priority:  normal  |  Component:  Compiler (Type checker)
  Version:  7.4.1-rc1   |   Keywords: 
   Os:  MacOS X |   Architecture:  Unknown/Multiple   
  Failure:  Compile-time crash  |   Testcase: 
Blockedby:  |   Blocking: 
  Related:  |  
+---
 Given these two files:
 {{{
 module A where
 -- empty
 }}}

 and

 {{{

 {-# LANGUAGE PolyKinds, TypeFamilies, UndecidableInstances #-}
 module B where

 import A

 data T = TT

 type family Compare (m :: T) :: Ordering
 type instance Compare TT = Compare TT

 type Compare' a = Compare a
 }}}

 We can cause an internal GHC error as follows:

 {{{
 $ rm *.o *.hi
 $ ghc B.hs
 [1 of 2] Compiling A( A.hs, A.o )
 [2 of 2] Compiling B( B.hs, B.o )
 $ sleep 1
 $ touch B.hs
 $ ghc B.hs
 [2 of 2] Compiling B( B.hs, B.o )

 B.hs:11:19:
 GHC internal error: `Compare' is not in scope during type checking,
 but it passed the renamer
 tcl_env of environment: [(a9R, AThing k_a9U)]
 In the type `Compare a'
 In the type synonym declaration for Compare'
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5792
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2012-01-11 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  lowest  |   Milestone:  7.4.2
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+

Comment(by brinchj):

 I installed the 7.4 RC and it seems to have been fixed (7.4.0.20120108).
 Thanks a lot! :)

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:7
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2012-01-11 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
+---
  Reporter:  brinchj|  Owner:
  Type:  bug| Status:  closed
  Priority:  lowest |  Milestone:  7.4.1 
 Component:  Compiler   |Version:  7.2.1 
Resolution:  fixed  |   Keywords:  biographical profiling
Os:  Linux  |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash  | Difficulty:  Unknown   
  Testcase: |  Blockedby:
  Blocking: |Related:  5451, 1519
+---
Changes (by igloo):

  * status:  infoneeded = closed
  * resolution:  = fixed
  * milestone:  7.4.2 = 7.4.1


Comment:

 Thanks for letting us know!

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:8
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2012-01-05 Thread GHC
#5085: internal error: evacuate: strange closure type
-+--
  Reporter:  mitar   |  Owner:  simonmar  
  Type:  bug | Status:  closed
  Priority:  highest |  Milestone:  7.4.1 
 Component:  Runtime System  |Version:  7.1   
Resolution:  wontfix |   Keywords:
Os:  Linux   |   Architecture:  x86_64 (amd64)
   Failure:  Runtime crash   | Difficulty:
  Testcase:  |  Blockedby:
  Blocking:  |Related:
-+--
Changes (by simonmar):

  * status:  new = closed
  * resolution:  = wontfix


Comment:

 I'm giving up on this one, sadly.  Let's hope the bug surfaces in another
 setting that is easier to reproduce.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:16
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-25 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  lowest  |   Milestone:  7.4.2
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+
Changes (by igloo):

  * priority:  normal = lowest
  * milestone:  = 7.4.2


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:6
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-16 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  normal  |   Milestone:   
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+
Changes (by simonmar):

  * status:  new = infoneeded
  * difficulty:  = Unknown


Comment:

 I don't know if your issue is fixed or not.  If you could try with the 7.4
 RC (due out soon) that would be great, otherwise please attach a test case
 and we'll look into it.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-16 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  normal  |   Milestone:   
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+

Comment(by brinchj):

 If ghc 7.4 rc is out soon, i'll give it a go and see if it works.
 Right now, I can't run the 7.4 due to a configuration error when
 installing the enumerator package:

 jos@laptux code/next ±master⚡  cabal install enumerator
 Resolving dependencies...
 cabal: cannot configure text-0.11.1.9. It requires integer-gmp =0.2 
 0.4
 There is no available version of integer-gmp that satisfies =0.2  0.4

 Regarding a small test case, I don't really know where to start. The
 project currently contains about 50 haskell modules, and I have no clue as
 to what part could cause the problem.

 There's a lot of IO going on, and the system is doing a bit of forkIO as
 well, running in several isolated lightweight threads.

 The error is triggered by the rts option -hb. Other options, like -hc or
 -p works. Btw, the exit code produced is 134.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:3
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-16 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  normal  |   Milestone:   
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+

Comment(by brinchj):

 Riiight, the threads aren't really isolated, but they communicate solely
 using STM and TChan/TMvar.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-16 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
Reporter:  brinchj |   Owner:   
Type:  bug |  Status:  infoneeded   
Priority:  normal  |   Milestone:   
   Component:  Compiler| Version:  7.2.1
Keywords:  biographical profiling  |  Os:  Linux
Architecture:  x86_64 (amd64)  | Failure:  Runtime crash
  Difficulty:  Unknown |Testcase:   
   Blockedby:  |Blocking:   
 Related:  5451, 1519  |  
---+

Comment(by simonmar):

 The test case doesn't have to be small, as long as it is reproducible and
 you can give us the source code.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-15 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
--+-
 Reporter:  brinchj   |  Owner:
 Type:  bug   | Status:  new   
 Priority:  normal|  Component:  Compiler  
  Version:  7.2.1 |   Keywords:  biographical profiling
   Os:  Unknown/Multiple  |   Architecture:  x86_64 (amd64)
  Failure:  None/Unknown  |   Testcase:
Blockedby:|   Blocking:
  Related:  5451, 1519|  
--+-
 I can't figure out if this has been fixed in 7.3 .. anyway, better safe
 than sorry, so here goes.

 I get this error with biographical profiling (like #5451 and #1519, i
 guess). It's present in both 7.2.1 and 7.2.2 - haven't tried 7.3 or 7.4.

 Just let me know if this is a fixed issue or not, and I'll see if I can
 provide a test case (it's not a completely trivial I'm trying to profile
 program).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5707: internal error: Invalid object in processHeapClosureForDead(): 0

2011-12-15 Thread GHC
#5707: internal error: Invalid object in processHeapClosureForDead(): 0
---+
 Reporter:  brinchj|  Owner:
 Type:  bug| Status:  new   
 Priority:  normal |  Component:  Compiler  
  Version:  7.2.1  |   Keywords:  biographical profiling
   Os:  Linux  |   Architecture:  x86_64 (amd64)
  Failure:  Runtime crash  |   Testcase:
Blockedby: |   Blocking:
  Related:  5451, 1519 |  
---+
Changes (by brinchj):

  * failure:  None/Unknown = Runtime crash
  * os:  Unknown/Multiple = Linux


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5707#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #4804: ghc-stage2: Monadic.o: bus error / segmentation fault / internal error

2011-12-05 Thread GHC
#4804: ghc-stage2: Monadic.o: bus error / segmentation fault / internal error
--+-
  Reporter:  altaic   |  Owner:  
  Type:  bug  | Status:  closed  
  Priority:  high |  Milestone:  7.4.1   
 Component:  Compiler |Version:  7.1 
Resolution:  worksforme   |   Keywords:  
  Testcase:   |  Blockedby:  
Difficulty:   | Os:  MacOS X 
  Blocking:   |   Architecture:  Unknown/Multiple
   Failure:  Building GHC failed  |  
--+-
Changes (by igloo):

  * status:  infoneeded = closed
  * resolution:  = worksforme


Comment:

 No response from submitter, so closing.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4804#comment:19
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2011-11-22 Thread GHC
#5085: internal error: evacuate: strange closure type
---+
Reporter:  mitar   |Owner:  simonmar 
Type:  bug |   Status:  new  
Priority:  highest |Milestone:  7.4.1
   Component:  Runtime System  |  Version:  7.1  
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Linux   | Blocking:   
Architecture:  x86_64 (amd64)  |  Failure:  Runtime crash
---+

Comment(by simonmar):

 I managed to get a segfault with this example and an up to date GHC built
 yesterday, using the suggested options (`-s 400 +RTS -N4`).  I've rebuilt
 the binary with `-debug` and I'm trying to provoke a segfault again, but
 two runs so far have been sucessful:

 {{{
 Generating a random graph of size 400.
 Graph contains 400 nodes and 5 edges.
 Dijkstra search time for shortest paths: 993.855562s
 Etage search time for shortest paths: 0.172937s (5.0s timeout)
 Etage graph (external structure) growing time: 7.674317s
 Found 0.75 % shortest paths.
 etage-graph-test: DissolvingException ()
 [1]31310 exit 1
 }}}

 at least, I assume that's a successful run.

 I'm not hopeful about finding this bug, because the program takes so long
 to run and ties up 4 cores.  I'll keep trying though.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:12
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2011-11-22 Thread GHC
#5085: internal error: evacuate: strange closure type
---+
Reporter:  mitar   |Owner:  simonmar 
Type:  bug |   Status:  new  
Priority:  highest |Milestone:  7.4.1
   Component:  Runtime System  |  Version:  7.1  
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Linux   | Blocking:   
Architecture:  x86_64 (amd64)  |  Failure:  Runtime crash
---+

Comment(by simonmar):

 I should have mentioned: if you know of a way to trigger the crash more
 often or more quickly, that would help a lot.  Do certain heap settings
 make it more likely to fail?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:13
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2011-11-22 Thread GHC
#5085: internal error: evacuate: strange closure type
---+
Reporter:  mitar   |Owner:  simonmar 
Type:  bug |   Status:  new  
Priority:  highest |Milestone:  7.4.1
   Component:  Runtime System  |  Version:  7.1  
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Linux   | Blocking:   
Architecture:  x86_64 (amd64)  |  Failure:  Runtime crash
---+

Comment(by mitar):

 Hm, this does not look like successful run, it seems your computer is
 slower (or probably because of the debugging is now slower) than mine and
 timeout is too low and not all paths have been found. ;-) It should find
 100 % of shortest paths. Maybe a little explanation of the program:

  * it generates a random graph of some size
  * it runs Dijkstra among all graph nodes
  * it generates a data-flow structure for search for shortest paths among
 all graph nodes
   * this structure is a structure of spark-based IO computations and
 connections between them
  * it runs search for all shortest paths, this is a message-passing
 algorithm among all nodes and a lot of sparks and inter-spark
 communication is happening (this is where a segfault occurs, because it
 really extensively use Haskell sparks)
   * stopping condition is that for some time (5 s timeout by default) no
 path has been improved, assuming all shortest paths have been found
  * it compares found shortest paths with known shortest paths (found with
 Dijkstra)

 So that only 0.75 % paths have been found means that in fact the
 problematic part of the code have not run long (enough). This is probably
 why it has succeeded.

 So when running in debug mode timeout should be increased. Please increase
 `minCollectTimeout` and `initialCollectTimeout` in `src/Test.hs`.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:14
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2011-11-22 Thread GHC
#5085: internal error: evacuate: strange closure type
---+
Reporter:  mitar   |Owner:  simonmar 
Type:  bug |   Status:  new  
Priority:  highest |Milestone:  7.4.1
   Component:  Runtime System  |  Version:  7.1  
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Linux   | Blocking:   
Architecture:  x86_64 (amd64)  |  Failure:  Runtime crash
---+

Comment(by mitar):

 I am sorry but I do not know how to generate a crash quicker. It is really
 a huge and extensive use of Haskell sparks and it seems it is a rare
 problem so it takes time to get it. I have not tested different heap
 settings.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:15
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #4804: ghc-stage2: Monadic.o: bus error / segmentation fault / internal error

2011-10-12 Thread GHC
#4804: ghc-stage2: Monadic.o: bus error / segmentation fault / internal error
-+--
Reporter:  altaic|Owner: 
Type:  bug   |   Status:  infoneeded 
Priority:  high  |Milestone:  7.4.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  MacOS X   | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--

Comment(by igloo):

 Is this still happening? If so, can you attach a log of the testsuite run,
 please (don't use multiple threads when running the testsuite).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4804#comment:18
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5502: ghc-stage2: internal error: invalid closure

2011-09-23 Thread GHC
#5502: ghc-stage2: internal error: invalid closure
+---
Reporter:  erikd|   Owner: 
Type:  bug  |  Status:  new
Priority:  normal   |   Component:  Compiler   
 Version:  7.3  |Keywords: 
Testcase:   |   Blockedby: 
  Os:  Linux|Blocking: 
Architecture:  powerpc  | Failure:  Building GHC failed
+---
 GHC head from git (commit 488e21c8cf07340c4d2f86f8177825a321cb312d).

 Stage 1 of compile completes but first compile command of second stage
 fails with:

 {{{
 inplace/bin/ghc-stage2   -H64m -O0 -fasm -i -iutils/ghctags/.
 -iutils/ghctags/dist-install/build -iutils/ghctags/dist-
 install/build/autogen -Iutils/ghctags/dist-install/build -Iutils/ghctags
 /dist-install/build/autogen-package ghc -no-user-package-conf
 -rtsopts -odir utils/ghctags/dist-install/build -hidir utils/ghctags
 /dist-install/build -stubdir utils/ghctags/dist-install/build -hisuf hi
 -osuf  o -hcsuf hc -c utils/ghctags/./Main.hs -o utils/ghctags/dist-
 install/build/Main.o
 ghc-stage2: internal error: invalid closure, info=(nil)
 (GHC version 7.3.20110923 for powerpc_unknown_linux)
 Please report this as a GHC bug:
 http://www.haskell.org/ghc/reportabug
 }}}

 This was working 10 days ago (commit
 493146ac822f05cebacf819d2f6a396f6e11d704). If needed, I can bisect to find
 the exact commit which broke it.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5502
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5085: internal error: evacuate: strange closure type

2011-09-11 Thread GHC
#5085: internal error: evacuate: strange closure type
---+
Reporter:  mitar   |Owner:  simonmar 
Type:  bug |   Status:  new  
Priority:  highest |Milestone:  7.4.1
   Component:  Runtime System  |  Version:  7.1  
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Linux   | Blocking:   
Architecture:  x86_64 (amd64)  |  Failure:  Runtime crash
---+
Changes (by igloo):

  * milestone:  7.2.1 = 7.4.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5085#comment:11
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


  1   2   3   4   5   6   >