[GHC] #1991: Improve GADT type inference

2007-12-18 Thread GHC
#1991: Improve GADT type inference
+---
Reporter:  guest|   Owner: 
Type:  feature request  |  Status:  new
Priority:  normal   |   Milestone: 
   Component:  Compiler (Type checker)  | Version:  6.6.1  
Severity:  normal   |Keywords: 
  Difficulty:  Unknown  |Testcase: 
Architecture:  Unknown  |  Os:  Unknown
+---
 It'd be nice if programs like the following didn't require type
 annotations:

 {{{
 data PromptR (r :: * -> *) (a :: *) where
NewRef :: a -> PromptR r (r a)
Fetch :: r a -> PromptR r a
Set :: r a -> a -> PromptR r ()

 -- prIO :: PromptR IORef a -> IO a
 prIO (NewRef a) = newIORef a
 prIO (Fetch r)  = readIORef r
 prIO (Set r v)  = writeIORef r v
 }}}

 I get the following cryptic error message:
 {{{
 prompt.lhs:193:7:
 Couldn't match kind `?' against `* -> *'
 When matching the kinds of `t :: ?' and `t1 :: * -> *'
   Expected type: t1
   Inferred type: t
 In the pattern: NewRef a
 }}}

 It seems to me you shouldn't need a type annotation here:
 {{{
 prIO (NewRef a) = newIORef a
 therefore:
   prIO :: x -> y
   x ~ PromptR r z

 in this case only:
   z ~ (r a), a :: a (from GADT argument)
   newIORef :: b -> IO (IORef b)
   a ~ b
   y ~ IO (IORef a) | r ~ IORef, y ~ IO (r a)

 prIO (Fetch r) = readIORef r
 in this case only:
   r :: r z (from GADT argument)
   readIORef :: IORef b -> IO b
   r ~ IORef
   b ~ z
   y ~ IO z

 attempt to unify with above case, and we get
   x ~ PromptR r z
   y ~ IO z
   r ~ IORef
   prIO :: PromptR IORef z -> IO z
 is the least specific possibility that matches both cases.
 }}}

 Interestingly, if I include only the second case, the type is inferred
 successfully; if I include the second and third cases, the type is
 inferred incorrectly as {{{PromptR IORef () -> IO ()}}}

 P.S. I only tested this on GHC6.6.1; apologies if this already works in
 6.8.

-- 
Ticket URL: 
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] #149: missed CSE opportunity

2007-12-18 Thread GHC
#149: missed CSE opportunity
---+
 Reporter:  nobody |  Owner: 
 Type:  bug| Status:  new
 Priority:  high   |  Milestone:  6.8.3  
Component:  Compiler   |Version:  5.04.2 
 Severity:  normal | Resolution:  None   
 Keywords:  optimisations  | Difficulty:  Unknown
 Testcase:  simplrun006|   Architecture:  Unknown
   Os:  Unknown|  
---+
Changes (by igloo):

  * priority:  low => high

Comment:

 This is a (possibly long-standing) regression.

-- 
Ticket URL: 
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] #1958: collect2: ld terminated with signal 10 [Bus error]: Building parsec on a PPC Mac OS X 10.5 Leopard as part of GHC 6.9

2007-12-18 Thread GHC
#1958: collect2: ld terminated with signal 10 [Bus error]: Building parsec on a
PPC Mac OS X 10.5 Leopard as part of GHC 6.9
-+--
 Reporter:  thorkilnaur  |  Owner: 
 Type:  bug  | Status:  new
 Priority:  high |  Milestone:  6.8.3  
Component:  Compiler |Version:  6.9
 Severity:  normal   | Resolution: 
 Keywords:   | Difficulty:  Unknown
 Testcase:   |   Architecture:  powerpc
   Os:  MacOS X  |  
-+--
Changes (by igloo):

  * priority:  normal => high

-- 
Ticket URL: 
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] #1898: segfault with +RTS -N2 (related to tryTakeMVar?)

2007-12-18 Thread GHC
#1898: segfault with +RTS -N2 (related to tryTakeMVar?)
+---
 Reporter:  j.waldmann  |  Owner: 
 Type:  bug | Status:  new
 Priority:  high|  Milestone:  6.8.3  
Component:  Compiler|Version:  6.8.1  
 Severity:  normal  | Resolution: 
 Keywords:  | Difficulty:  Unknown
 Testcase:  |   Architecture:  x86
   Os:  Linux   |  
+---
Changes (by igloo):

  * priority:  normal => high

-- 
Ticket URL: 
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] #1890: Regression in mandelbrot benchmark due to inlining

2007-12-18 Thread GHC
#1890: Regression in mandelbrot benchmark due to inlining
---+
 Reporter:  dons   |  Owner:
 Type:  bug| Status:  new   
 Priority:  high   |  Milestone:  6.8.3 
Component:  Compiler   |Version:  6.8.1 
 Severity:  normal | Resolution:
 Keywords:  inlining, performance  | Difficulty:  Unknown   
 Testcase: |   Architecture:  x86_64 (amd64)
   Os:  Unknown|  
---+
Changes (by igloo):

  * priority:  normal => high

Comment:

 Don, is this reproducible for you?

-- 
Ticket URL: 
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] #1889: Regression in concurrency performance from ghc 6.6 to 6.8

2007-12-18 Thread GHC
#1889: Regression in concurrency performance from ghc 6.6 to 6.8
---+
 Reporter:  dons   |  Owner:  simonmar
 Type:  bug| Status:  new 
 Priority:  high   |  Milestone:  6.8.3   
Component:  Runtime System |Version:  6.8.1   
 Severity:  normal | Resolution:  
 Keywords:  threads, concurrency, performance  | Difficulty:  Unknown 
 Testcase: |   Architecture:  Multiple
   Os:  Multiple   |  
---+
Changes (by igloo):

  * priority:  normal => high

-- 
Ticket URL: 
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] #1818: Code size increase vs. 6.6.1

2007-12-18 Thread GHC
#1818: Code size increase vs. 6.6.1
--+-
 Reporter:  simonmar  |  Owner: 
 Type:  bug   | Status:  new
 Priority:  high  |  Milestone:  6.8.3  
Component:  Compiler  |Version:  6.8.1  
 Severity:  normal| Resolution: 
 Keywords:| Difficulty:  Unknown
 Testcase:|   Architecture:  Unknown
   Os:  Unknown   |  
--+-
Changes (by igloo):

  * priority:  normal => high

-- 
Ticket URL: 
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] #1540: GHC on Macs

2007-12-18 Thread GHC
#1540: GHC on Macs
--+-
 Reporter:  guest |  Owner:
 Type:  task  | Status:  new   
 Priority:  high  |  Milestone:  6.8 branch
Component:  Build System  |Version:  6.6.1 
 Severity:  normal| Resolution:
 Keywords:| Difficulty:  Unknown   
 Testcase:|   Architecture:  x86   
   Os:  MacOS X   |  
--+-
Changes (by dgoldsmith):

 * cc: [EMAIL PROTECTED] (added)

-- 
Ticket URL: 
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] #1523: Constant overhead of threadDelay

2007-12-18 Thread GHC
#1523: Constant overhead of threadDelay
+---
 Reporter:  chak|  Owner:  [EMAIL PROTECTED]
 Type:  bug | Status:  new  
 Priority:  normal  |  Milestone:  6.8.3
Component:  libraries/base  |Version:  6.7  
 Severity:  normal  | Resolution:   
 Keywords:  | Difficulty:  Unknown  
 Testcase:  |   Architecture:  x86  
   Os:  MacOS X |  
+---
Changes (by igloo):

  * owner:  => [EMAIL PROTECTED]

Comment:

 Manuel, are you able to retest this please?

-- 
Ticket URL: 
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] #1346: bootstrap from HC files

2007-12-18 Thread GHC
#1346: bootstrap from HC files
--+-
 Reporter:  simonmar  |  Owner:  igloo   
 Type:  bug   | Status:  new 
 Priority:  normal|  Milestone:  6.8.3   
Component:  Build System  |Version:  6.6.1   
 Severity:  normal| Resolution:  
 Keywords:| Difficulty:  Moderate (1 day)
 Testcase:|   Architecture:  Unknown 
   Os:  Unknown   |  
--+-
Changes (by igloo):

  * owner:  => igloo

-- 
Ticket URL: 
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] #1861: Uncompilable code generated

2007-12-18 Thread GHC
#1861: Uncompilable code generated
--+-
 Reporter:  guest |  Owner: 
 Type:  bug   | Status:  new
 Priority:  normal|  Milestone:  6.8.3  
Component:  Compiler  |Version:  6.8.1  
 Severity:  normal| Resolution: 
 Keywords:| Difficulty:  Unknown
 Testcase:|   Architecture:  x86
   Os:  MacOS X   |  
--+-
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #955: more object-code blow-up in ghc-6.6 vs. ghc-6.4.2 (both with optimization)

2007-12-18 Thread GHC
#955: more object-code blow-up in ghc-6.6 vs. ghc-6.4.2 (both with optimization)
-+--
 Reporter:  [EMAIL PROTECTED]|  Owner:  
 Type:  bug  | Status:  new 
 Priority:  high |  Milestone:  6.8.3   
Component:  Compiler |Version:  6.6 
 Severity:  normal   | Resolution:  
 Keywords:  object-code blow-up  | Difficulty:  Unknown 
 Testcase:   |   Architecture:  Multiple
   Os:  Multiple |  
-+--
Changes (by igloo):

  * priority:  normal => high

Comment:

 Regression, so high priority

-- 
Ticket URL: 
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] #1779: unknown symbol `hs_hpc_module'

2007-12-18 Thread GHC
#1779: unknown symbol `hs_hpc_module'
-+--
 Reporter:  guest|  Owner:  AndyGill   
 Type:  feature request  | Status:  assigned   
 Priority:  low  |  Milestone:  6.10 branch
Component:  GHCi |Version:  6.9
 Severity:  minor| Resolution: 
 Keywords:  hpc  | Difficulty:  Unknown
 Testcase:   |   Architecture:  Unknown
   Os:  Unknown  |  
-+--
Changes (by igloo):

  * milestone:  6.8.2 => 6.10 branch

Comment:

 At this stage I think we'll just wait for a proper fix.

-- 
Ticket URL: 
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] #1870: ghc-6.8.1 panics compiling regex-tdfa-0.93

2007-12-18 Thread GHC
#1870: ghc-6.8.1 panics compiling regex-tdfa-0.93
+---
 Reporter:  ChrisKuklewicz  |  Owner:  simonpj
 Type:  bug | Status:  new
 Priority:  low |  Milestone:  6.8.3  
Component:  Compiler|Version:  6.8.1  
 Severity:  normal  | Resolution: 
 Keywords:  | Difficulty:  Unknown
 Testcase:  |   Architecture:  Unknown
   Os:  Unknown |  
+---
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #1962: make binary-dist creates nested directories under solaris

2007-12-18 Thread GHC
#1962: make binary-dist creates nested directories under solaris
--+-
 Reporter:  maeder|  Owner: 
 Type:  bug   | Status:  new
 Priority:  normal|  Milestone:  6.8.3  
Component:  Build System  |Version:  6.8.1  
 Severity:  normal| Resolution: 
 Keywords:| Difficulty:  Unknown
 Testcase:|   Architecture:  x86
   Os:  Solaris   |  
--+-
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #1944: round function causes cblas NaNs

2007-12-18 Thread GHC
#1944: round function causes cblas NaNs
---+
 Reporter:  SevenThunders  |  Owner: 
 Type:  bug| Status:  new
 Priority:  normal |  Milestone:  6.8.3  
Component:  Compiler   |Version:  6.8.1  
 Severity:  critical   | Resolution: 
 Keywords: | Difficulty:  Unknown
 Testcase: |   Architecture:  x86
   Os:  Windows|  
---+
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #1845: unconditional relative branch out of range (GHC version 6.8.1 for powerpc_apple_darwin)

2007-12-18 Thread GHC
#1845: unconditional relative branch out of range (GHC version 6.8.1 for
powerpc_apple_darwin)
-+--
 Reporter:  guest|  Owner: 
 Type:  bug  | Status:  new
 Priority:  normal   |  Milestone:  6.8.3  
Component:  GHCi |Version:  6.8.1  
 Severity:  normal   | Resolution: 
 Keywords:   | Difficulty:  Unknown
 Testcase:   |   Architecture:  powerpc
   Os:  MacOS X  |  
-+--
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #1605: hppa port -- gmp handed misaligned memory

2007-12-18 Thread GHC
#1605: hppa port -- gmp handed misaligned memory
+---
 Reporter:  guest   |  Owner: 
 Type:  bug | Status:  new
 Priority:  normal  |  Milestone:  6.8.3  
Component:  Runtime System  |Version:  6.6.1  
 Severity:  normal  | Resolution: 
 Keywords:  GMP | Difficulty:  Easy (1 hr)
 Testcase:  |   Architecture:  hppa   
   Os:  HPUX|  
+---
Changes (by igloo):

  * milestone:  6.8.2 => 6.8.3

-- 
Ticket URL: 
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] #1990: Add 'subsequences' and 'permutations' to Data.List

2007-12-18 Thread GHC
#1990: Add 'subsequences' and 'permutations' to Data.List
---+
Reporter:  twanvl  |   Owner: 
Type:  proposal|  Status:  new
Priority:  normal  |   Milestone:  Not GHC
   Component:  libraries/base  | Version:  6.8.1  
Severity:  normal  |Keywords: 
  Difficulty:  Unknown |Testcase: 
Architecture:  Unknown |  Os:  Unknown
---+
 Haskell 1.3 included the functions 'subsequences' and 'permutations'. I
 think these functions are quite useful, and I don't know why they were
 ever removed. This is a proposal to add these two functions to Data.List.
 The implementation is taken directly from the Haskell 1.3 report
 (http://haskell.cs.yale.edu/haskell-report/List.html).

-- 
Ticket URL: 
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] #1989: GHC-6.8.1 fails arith003 on amd64/FreeBSD-7.0

2007-12-18 Thread GHC
#1989: GHC-6.8.1 fails arith003 on amd64/FreeBSD-7.0
--+-
 Reporter:  wb.kloke  |  Owner:
 Type:  bug   | Status:  new   
 Priority:  normal|  Milestone:
Component:  Compiler  |Version:  6.8.2 
 Severity:  normal| Resolution:
 Keywords:| Difficulty:  Unknown   
 Testcase:|   Architecture:  x86_64 (amd64)
   Os:  FreeBSD   |  
--+-
Changes (by wb.kloke):

  * os:  Unknown => FreeBSD
  * architecture:  Unknown => x86_64 (amd64)
  * summary:  GHC-6.8.1 fails to reproduce itself on amd64/FreeBSD-7.0 =>
  GHC-6.8.1 fails arith003 on amd64/FreeBSD-7.0

Comment:

 Please forget the complaint about non-reproductivity. I just built stage2
 und stage3. The problem with show minInt is not going away, though.

-- 
Ticket URL: 
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] #1989: GHC-6.8.1 fails to reproduce itself on amd64/FreeBSD-7.0

2007-12-18 Thread GHC
#1989: GHC-6.8.1 fails to reproduce itself on amd64/FreeBSD-7.0
-+--
Reporter:  wb.kloke  |   Owner: 
Type:  bug   |  Status:  new
Priority:  normal|   Milestone: 
   Component:  Compiler  | Version:  6.8.2  
Severity:  normal|Keywords: 
  Difficulty:  Unknown   |Testcase: 
Architecture:  Unknown   |  Os:  Unknown
-+--
 I am trying to build a native amd64 compiler on FreeBSD. At the bootstrap
 stage I use the -i386
 compiler as ghc: This works to stage1. The stage1 compiler is usable in a
 limited way. But the stage2 compiler built with this fails very early
 (before even complaining about missing -B options, if started naked).

 Ex.:
 /home/wb.local/ghc-6.8.2 0$ compiler/stage2/ghc-6.8.2
 Segmentation fault: 11 (core dumped)
 [EMAIL PROTECTED]:ttyp2
 /home/wb.local/ghc-6.8.2 0$ compiler/stage1/ghc-6.8.2
 ghc-6.8.2: missing -B option


 The most reproducable misbehaviour of the stage1 compiler is the unability
 to run test arith003. The value minInt is converted to a nonprintable
 1-char string in the int_ops part. Most other results, including the
 multiple precision tests, look better than the output from x86-64-openbsd
 (as published with the 6.6.1-testsuite). It looks as if there is a
 specific problem with bit pattern 0x8000L. If I change the
 source code to avoid this pattern (minInt -> minInt+1) the error does not
 occur.

 First lines of arith003 output:

 (+) 0 0 = 0
 (+) 0 1 = 1
 (+) 0 -1 = -1
 (+) 0 2 = 2
 (+) 0 -2 = -2
 (+) 0 -8 = -8
 (+) 0 9223372036854775807 = 9223372036854775807
 (+) 1 0 = 1
 (+) 1 1 = 2
 (+) 1 -1 = 0
 (+) 1 2 = 3
 (+) 1 -2 = -1
 (+) 1 -8 = -9223372036854775807
 (+) 1 9223372036854775807 = -8
 (+) -1 0 = -1
 (+) -1 1 = 0
 (+) -1 -1 = -2
 (+) -1 2 = 1
 (+) -1 -2 = -3
 (+) -1 -8 = 9223372036854775807
 (+) -1 9223372036854775807 = 9223372036854775806
 (+) 2 0 = 2
 (+) 2 1 = 3
 (+) 2 -1 = 1
 (+) 2 2 = 4
 (+) 2 -2 = 0
 (+) 2 -8 = -9223372036854775806
 (+) 2 9223372036854775807 = -9223372036854775807
 (+) -2 0 = -2
 (+) -2 1 = -1
 (+) -2 -1 = -3
 (+) -2 2 = 0
 (+) -2 -2 = -4
 (+) -2 -8 = 9223372036854775806
 (+) -2 9223372036854775807 = 9223372036854775805
 (+) -8 0 = -8
 (+) -8 1 = -9223372036854775807
 (+) -8 -1 = 9223372036854775807
 (+) -8 2 = -9223372036854775806
 (+) -8 -2 = 9223372036854775806
 (+) -8 -8 = 0
 (+) -8 9223372036854775807 = -1
 (+) 9223372036854775807 0 = 9223372036854775807
 (+) 9223372036854775807 1 = -8
 (+) 9223372036854775807 -1 = 9223372036854775806
 (+) 9223372036854775807 2 = -9223372036854775807
 (+) 9223372036854775807 -2 = 9223372036854775805
 (+) 9223372036854775807 -8 = -1
 (+) 9223372036854775807 9223372036854775807 = -2
 ...

-- 
Ticket URL: 
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] #1988: [6.8.1 regression] 6.8.2 panics in nameModule with -O2

2007-12-18 Thread GHC
#1988: [6.8.1 regression] 6.8.2 panics in nameModule with -O2
--+-
 Reporter:  guest |  Owner: 
 Type:  bug   | Status:  new
 Priority:  high  |  Milestone:  6.8.3  
Component:  Compiler  |Version:  6.8.2  
 Severity:  normal| Resolution: 
 Keywords:| Difficulty:  Unknown
 Testcase:|   Architecture:  x86
   Os:  MacOS X   |  
--+-
Changes (by simonmar):

  * priority:  normal => high
  * summary:  6.8.2 panics in nameModule with -O2 => [6.8.1 regression]
  6.8.2 panics in nameModule with -O2
  * milestone:  => 6.8.3

-- 
Ticket URL: 
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] #1988: 6.8.2 panics in nameModule with -O2

2007-12-18 Thread GHC
#1988: 6.8.2 panics in nameModule with -O2
-+--
Reporter:  guest |   Owner: 
Type:  bug   |  Status:  new
Priority:  normal|   Milestone: 
   Component:  Compiler  | Version:  6.8.2  
Severity:  normal|Keywords: 
  Difficulty:  Unknown   |Testcase: 
Architecture:  x86   |  Os:  MacOS X
-+--
 The attached file makes GHC 6.8.2 panic:

 {{{
 $ ghc-6.8.2 -fforce-recomp -O2 -c PPrCF.hs
 ghc-6.8.2: panic! (the 'impossible' happened)
   (GHC version 6.8.2 for i386-apple-darwin):
 nameModule $wprCFTree{v sdg}

 Please report this as a GHC bug:  http://www.haskell.org/ghc/reportabug
 }}}

 It only happens with -O2:

 {{{
 $ ghc-6.8.2 -fforce-recomp -O1 -c PPrCF.hs
 }}}

 And only with 6.8.2:

 {{{
 $ ghc-6.8.1 -fforce-recomp -O2 -c PPrCF.hs
 $ ghc-6.6.1 -fforce-recomp -O2 -c PPrCF.hs
 }}}

 -dcore-lint gives no additional information.

 Adding a NOINLINE pragma for prCFTree makes the panic go away.

 This problem and the NOINLINE work-around was found by Jean-Philippe
 Bernardy in GF.

-- 
Ticket URL: 
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] #1395: let ./configure check for a GNUreadline framework

2007-12-18 Thread GHC
#1395: let ./configure check for a GNUreadline framework
-+--
 Reporter:  [EMAIL PROTECTED]|  Owner: 
 Type:  feature request  | Status:  reopened   
 Priority:  normal   |  Milestone:  6.8 branch 
Component:  Build System |Version:  6.8
 Severity:  normal   | Resolution: 
 Keywords:   | Difficulty:  Easy (1 hr)
 Testcase:   |   Architecture:  Multiple   
   Os:  MacOS X  |  
-+--
Comment (by maeder):

 The two files `compiler/main/DriverPipeline.hs` and `utils/hsc2hs/Main.hs`
 are not ready for check in. Both files miss catching an error of
 `getHomeDirectory` and the relevant parts of `utils/hsc2hs/Main.hs` should
 be put between cpp directives. (I'm also not sure if the use of
 `getHomeDirectory` prevents ghc being bootstrapped with some earlier ghc
 versions.)

 {{{
 #ifdef darwin_TARGET_OS
 hdir <- IO.try getHomeDirectory
 #endif
 }}}

 Only after these changes it makes sense to check in
 `readline/configure.2.ac`.

-- 
Ticket URL: 
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] #1987: GHCi's config file in \ghc folder on Windows

2007-12-18 Thread GHC
#1987: GHCi's config file in \ghc folder on Windows
--+-
 Reporter:  felixmar  |  Owner: 
 Type:  proposal  | Status:  new
 Priority:  low   |  Milestone:  6.10 branch
Component:  GHCi  |Version:  6.9
 Severity:  normal| Resolution: 
 Keywords:| Difficulty:  Unknown
 Testcase:|   Architecture:  Unknown
   Os:  Windows   |  
--+-
Changes (by felixmar):

  * summary:  GHCi's config file in \ghci folder on Windows =>
  GHCi's config file in \ghc folder on
  Windows

Comment:

 Patch v2: config file in {{{\ghc}}} instead of
 {{{\ghci}}} as Simon Marlow requested. Like version 1, behaviour
 on non-Windows systems is unchanged.

-- 
Ticket URL: 
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] #1798: add better framework support to ghc

2007-12-18 Thread GHC
#1798: add better framework support to ghc
-+--
 Reporter:  guest|  Owner: 
 Type:  feature request  | Status:  new
 Priority:  normal   |  Milestone:  6.10 branch
Component:  Compiler |Version:  6.6.1  
 Severity:  normal   | Resolution: 
 Keywords:   | Difficulty:  Unknown
 Testcase:   |   Architecture:  Multiple   
   Os:  MacOS X  |  
-+--
Comment (by maeder):

 We could easily add `/Network/Library/Frameworks` to
 `defaultFrameworkPaths`, to make it just a bit more similar to dyld.

-- 
Ticket URL: 
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] #1980: sporadic segmentation faults

2007-12-18 Thread GHC
#1980: sporadic segmentation faults
+---
 Reporter:  maeder  |  Owner:  igloo  
 Type:  merge   | Status:  new
 Priority:  normal  |  Milestone:  6.8.3  
Component:  Runtime System  |Version:  6.8.2  
 Severity:  normal  | Resolution: 
 Keywords:  | Difficulty:  Unknown
 Testcase:  |   Architecture:  x86
   Os:  Linux   |  
+---
Changes (by simonmar):

  * owner:  simonmar => igloo
  * type:  bug => merge

Comment:

 Fixed:

 {{{
 Mon Dec 17 16:46:10 GMT 2007  Simon Marlow <[EMAIL PROTECTED]>
   * FIX #1980: must check for ThreadRelocated in killThread#
 }}}

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs