Re: [GHC] #1692: GLUT timedCallback fires twice

2007-09-26 Thread GHC
#1692: GLUT timedCallback fires twice
---+
Reporter:  [EMAIL PROTECTED]  |Owner:  [EMAIL PROTECTED]
Type:  bug |   Status:  new 
Priority:  normal  |Milestone:  Not GHC 
   Component:  libraries (other)   |  Version:  6.6.1   
Severity:  normal  |   Resolution:  
Keywords:  |   Difficulty:  Unknown 
  Os:  MacOS X | Testcase:  
Architecture:  x86 |  
---+
Comment (by guest):

 The C version is as close as I could make it.  There is no test 3 because,
 AFAIK, C doesn't have light-weight threads.

 The C version seems to work fine; the events fire as desired.  At the
 least, this suggests a workaround using the FFI.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1692#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] #1340: Hpc Documentation

2007-09-26 Thread GHC
#1340: Hpc Documentation
--+-
Reporter:  AndyGill   |Owner:  AndyGill
Type:  merge  |   Status:  reopened
Priority:  high   |Milestone:  6.8.1   
   Component:  Documentation  |  Version:  6.7 
Severity:  normal |   Resolution:  
Keywords: |   Difficulty:  Moderate (1 day)
  Os:  Unknown| Testcase:  
Architecture:  Unknown|  
--+-
Changes (by simonmar):

  * status:  closed = reopened
  * type:  task = merge
  * resolution:  fixed =
  * milestone:  6.8 branch = 6.8.1

Comment:

 merge needed:

 {{{
 Tue Sep 25 22:53:31 PDT 2007  [EMAIL PROTECTED]
   * Fixing #1340, adding HPC Documentation
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1340#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] #1730: type families GHC impossible happened

2007-09-26 Thread GHC
#1730: type families GHC impossible happened
+---
Reporter:  guest|Owner:  chak   
Type:  bug  |   Status:  new
Priority:  normal   |Milestone: 
   Component:  Compiler |  Version:  6.8
Severity:  normal   |   Resolution: 
Keywords:  type families panic  |   Difficulty:  Unknown
  Os:  Unknown  | Testcase: 
Architecture:  Unknown  |  
+---
Changes (by chak):

  * owner:  = chak

Comment:

 Copy of the code at hpaste to avoid it getting lost when it expires:
 {{{
 {-# OPTIONS -fglasgow-exts -cpp #-}
 -
 -- |
 -- Module  :  Data.Collections.Foldable
 -- Copyright   :  Ross Paterson 2005, adaptation to MPTC+FD by Jean-
 Philippe Bernardy
 -- License :  BSD-style (see the LICENSE file in the distribution)
 --
 -- Maintainer  :  jeanphilippe.bernardy (google mail address)
 -- Stability   :  experimental
 -- Portability :  MPTC+FD
 --
 -- Class of data structures that can be folded to a summary value.

 module Data.Collections.Foldable (
 -- * Folds
 Foldable(..),
 -- ** Special biased folds
 foldr',
 foldl',
 foldrM,
 foldlM,
 -- ** Folding actions
 -- *** Applicative actions
 traverse_,
 for_,
 sequenceA_,
 asum,
 -- *** Monadic actions
 mapM_,
 forM_,
 sequence_,
 msum,
 -- ** Specialized folds
 toList,
 --More general versions exist in Data.Collections
 --concat,
 --concatMap,
 and,
 or,
 any,
 all,
 sum,
 product,
 maximum,
 maximumBy,
 minimum,
 minimumBy,
 -- ** Searches
 elem,
 notElem,
 find
 ) where

 import Prelude hiding (foldl, foldr, foldl1, foldr1, mapM_, sequence_,
 elem, notElem, concat, concatMap, and, or, any, all,
 sum, product, maximum, minimum)
 import qualified Prelude (foldl, foldr, foldl1, foldr1)
 import Control.Applicative
 import Control.Monad (MonadPlus(..))
 import Data.Maybe (fromMaybe, listToMaybe)
 import Data.Monoid
 import Data.Array

 #ifdef __NHC__
 import Control.Arrow (ArrowZero(..)) -- work around nhc98 typechecker
 problem
 #endif

 #ifdef __GLASGOW_HASKELL__
 import GHC.Exts (build)
 #endif

 -- | Data structures that can be folded.
 --
 -- Minimal complete definition: 'foldMap' or 'foldr'.
 --
 -- For example, given a data type
 --
 --  data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a)
 --
 -- a suitable instance would be
 --
 --  instance Foldable Tree
 -- foldMap f Empty = mempty
 -- foldMap f (Leaf x) = f x
 -- foldMap f (Node l k r) = foldMap f l `mappend` f k `mappend`
 foldMap f r
 --
 -- This is suitable even for abstract types, as the monoid is assumed
 -- to satisfy the monoid laws.
 --
 class Foldable t where

 type FoldElem t

 -- | Combine the elements of a structure using a monoid.
 fold :: Monoid (FoldElem t) = t - FoldElem t
 fold = foldMap id

 -- | Map each element of the structure to a monoid,
 -- and combine the results.
 foldMap :: Monoid m = (FoldElem t - m) - t - m
 foldMap f = foldr (mappend . f) mempty

 -- | Right-associative fold of a structure.
 --
 -- @'foldr' f z = 'Prelude.foldr' f z . 'toList'@
 foldr :: (FoldElem t - b - b) - b - t - b
 foldr f z t = appEndo (foldMap (Endo . f) t) z

 -- | Left-associative fold of a structure.
 --
 -- @'foldl' f z = 'Prelude.foldl' f z . 'toList'@
 foldl :: (b - FoldElem t - b) - b - t - b
 foldl f z t = appEndo (getDual (foldMap (Dual . Endo . flip f) t))
 z

 -- | A variant of 'foldr' that has no base case,
 -- and thus may only be applied to non-empty structures.
 --
 -- @'foldr1' f = 'Prelude.foldr1' f . 'toList'@
 foldr1 :: (FoldElem t - FoldElem t - FoldElem t) - t -
 FoldElem t
 foldr1 f xs = fromMaybe (error foldr1: empty structure)
 (foldr mf Nothing xs)
   where mf x Nothing = Just x
 mf x (Just y) = Just (f x y)

 -- | A variant of 'foldl' that has no base case,
 -- and thus may only be applied to non-empty structures.
 --
 -- @'foldl1' f = 'Prelude.foldl1' f . 'toList'@
 foldl1 :: (FoldElem t - FoldElem t - FoldElem t) - t -
 FoldElem t
 foldl1 f xs = fromMaybe (error foldl1: empty structure)
 (foldl mf Nothing xs)
   where mf 

Re: [GHC] #1729: panic on type family

2007-09-26 Thread GHC
#1729: panic on type family
+---
Reporter:  jpbernardy   |Owner:  chak   
Type:  bug  |   Status:  new
Priority:  normal   |Milestone: 
   Component:  Compiler (Type checker)  |  Version:  6.8
Severity:  major|   Resolution: 
Keywords:   |   Difficulty:  Unknown
  Os:  Linux| Testcase: 
Architecture:  x86  |  
+---
Changes (by chak):

  * owner:  = chak

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1729#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] #961: implement associated type synonyms

2007-09-26 Thread GHC
#961: implement associated type synonyms
---+
Reporter:  Samuel Bronson [EMAIL PROTECTED]  |Owner:  chak  
Type:  task|   Status:  closed
Priority:  normal  |Milestone:  6.8 branch
   Component:  Compiler (Type checker) |  Version:  6.7   
Severity:  normal  |   Resolution:  fixed 
Keywords:  |   Difficulty:  Unknown   
  Os:  Unknown | Testcase:
Architecture:  Unknown |  
---+
Changes (by chak):

  * status:  new = closed
  * resolution:  = fixed

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/961#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] #1715: seldom panic

2007-09-26 Thread GHC
#1715: seldom panic
---+
Reporter:  [EMAIL PROTECTED]  |Owner:  chak   
Type:  bug |   Status:  new
Priority:  normal  |Milestone: 
   Component:  Compiler|  Version:  6.8
Severity:  critical|   Resolution: 
Keywords:  |   Difficulty:  Unknown
  Os:  Linux   | Testcase: 
Architecture:  x86 |  
---+
Changes (by chak):

  * owner:  = chak

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1715#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] #1737: cholewo-eval -dcore-lint failure in 6.8.1

2007-09-26 Thread GHC
#1737: cholewo-eval -dcore-lint failure in 6.8.1
---+
  Reporter:  simonmar  |  Owner: 
  Type:  bug   | Status:  new
  Priority:  high  |  Milestone:  6.8.1  
 Component:  Compiler  |Version:  6.6.1  
  Severity:  normal|   Keywords: 
Difficulty:  Unknown   | Os:  Unknown
  Testcase:|   Architecture:  Unknown
---+
 Module `programs/cholewo-eval/Arr.lhs` in the test suite gives a Core Lint
 failure when compiled (no extra options apart from `-dcore-lint`).  This
 appears to be a regression from 6.6.1.  Simon PJ is looking into it.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1737
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] #1737: cholewo-eval -dcore-lint failure in 6.8.1

2007-09-26 Thread GHC
#1737: cholewo-eval -dcore-lint failure in 6.8.1
-+--
Reporter:  simonmar  |Owner:  simonpj 
Type:  bug   |   Status:  new 
Priority:  high  |Milestone:  6.8.1   
   Component:  Compiler  |  Version:  6.6.1   
Severity:  normal|   Resolution:  
Keywords:|   Difficulty:  Unknown 
  Os:  Unknown   | Testcase:  cholewo-eval
Architecture:  Unknown   |  
-+--
Changes (by simonmar):

  * testcase:  = cholewo-eval
  * owner:  = simonpj

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1737#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] #1734: needless panic in :show modules

2007-09-26 Thread GHC
#1734: needless panic in :show modules
+---
Reporter:  guest|Owner:  simonmar
Type:  bug  |   Status:  new 
Priority:  normal   |Milestone:  
   Component:  GHCi |  Version:  6.6.1   
Severity:  normal   |   Resolution:  
Keywords:   |   Difficulty:  Unknown 
  Os:  Unknown  | Testcase:  
Architecture:  Unknown  |  
+---
Changes (by simonmar):

  * owner:  = simonmar

Comment:

 validating fix

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1734#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] #1257: Bytecode generator can't handle unboxed tuples

2007-09-26 Thread GHC
#1257: Bytecode generator can't handle unboxed tuples
+---
Reporter:  igloo|Owner:  
Type:  bug  |   Status:  new 
Priority:  normal   |Milestone:  _|_ 
   Component:  GHCi |  Version:  6.6 
Severity:  normal   |   Resolution:  
Keywords:   |   Difficulty:  Unknown 
  Os:  Unknown  | Testcase:  dsrun014
Architecture:  Unknown  |  
+---
Changes (by simonmar):

  * owner:  simonmar =
  * milestone:  6.8 branch = _|_

Comment:

 This isn't going to happen, mainly because there are an infinite family of
 return conventions for unboxed tuples.  We could cover more cases without
 too much difficulty, but the general case is really hard.  Given that you
 can now do `-fobject-code`, it doesn't really seem worth it.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1257#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] #1738: GADT3 test failure

2007-09-26 Thread GHC
#1738: GADT3 test failure
---+
  Reporter:  simonmar  |  Owner: 
  Type:  bug   | Status:  new
  Priority:  normal|  Milestone:  6.10 branch
 Component:  Compiler  |Version:  6.9
  Severity:  normal|   Keywords: 
Difficulty:  Unknown   | Os:  Unknown
  Testcase:|   Architecture:  Unknown
---+
 GADT3 is failing normal/optc, but not profc/profasm.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1738
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] #1738: GADT3 test failure

2007-09-26 Thread GHC
#1738: GADT3 test failure
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  normal|Milestone:  6.10 branch
   Component:  Compiler  |  Version:  6.9
Severity:  normal|   Resolution: 
Keywords:|   Difficulty:  Unknown
  Os:  Unknown   | Testcase:  GADT3  
Architecture:  Unknown   |  
-+--
Changes (by simonmar):

  * testcase:  = GADT3

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1738#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] #1734: needless panic in :show modules

2007-09-26 Thread GHC
#1734: needless panic in :show modules
+---
Reporter:  guest|Owner:  igloo  
Type:  merge|   Status:  new
Priority:  normal   |Milestone: 
   Component:  GHCi |  Version:  6.6.1  
Severity:  normal   |   Resolution: 
Keywords:   |   Difficulty:  Unknown
  Os:  Unknown  | Testcase: 
Architecture:  Unknown  |  
+---
Changes (by simonmar):

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

Comment:

 {{{
 Wed Sep 26 03:07:32 PDT 2007  Simon Marlow [EMAIL PROTECTED]
   * fix #1734, panic in :show modules after load failure
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1734#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] #1739: Can't compile apps with the -fvia-C flag - Can't locate vars.pm

2007-09-26 Thread GHC
#1739: Can't compile apps with the -fvia-C flag - Can't locate vars.pm
---+
  Reporter:  guest |  Owner: 
  Type:  bug   | Status:  new
  Priority:  normal|  Milestone: 
 Component:  Compiler  |Version:  6.8
  Severity:  normal|   Keywords: 
Difficulty:  Unknown   | Os:  Windows
  Testcase:|   Architecture:  x86
---+
 When I try to compile even the simplest application with the -fvia-C
 flags, the compilation fails with the following error message:

 {{{
 Can't locate vars.pm in @INC (@INC contains: C:/ghc/ghc-6.8.0.20070925/lib
 .) at
  C:\ghc\ghc-6.8.0.20070925\ghc-asm line 1289.
 BEGIN failed--compilation aborted at C:\ghc\ghc-6.8.0.20070925\ghc-asm
 line 1289
 }}}

 the app I used to reproduce bug:
 {{{
 main = putStrLn Hello, World!
 }}}
 vars.pm is not present in older versions of GHC but they don't have this
 problem.

 Cheers,

 Olivier Boudry.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1739
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] #1739: Can't compile apps with the -fvia-C flag - Can't locate vars.pm

2007-09-26 Thread GHC
#1739: Can't compile apps with the -fvia-C flag - Can't locate vars.pm
-+--
Reporter:  guest |Owner: 
Type:  bug   |   Status:  new
Priority:  normal|Milestone: 
   Component:  Compiler  |  Version:  6.8
Severity:  normal|   Resolution: 
Keywords:|   Difficulty:  Unknown
  Os:  Windows   | Testcase: 
Architecture:  x86   |  
-+--
Comment (by guest):

 It looks like 3 use vars ... instructions made their way into the ghc-
 asm perl script (lines 1289, 1866 and 1882). According to comments they
 may be unused (# Unused?).

 I tried to comment out the 3 use vars ... instructions and could compile
 using the -fvia-C option.

 Cheers,

 Olivier.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1739#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] #1198: Windows: hWaitForInput returns False for file handles

2007-09-26 Thread GHC
#1198: Windows: hWaitForInput returns False for file handles
---+
Reporter:  igloo   |Owner: 
Type:  bug |   Status:  new
Priority:  low |Milestone:  6.8 branch 
   Component:  libraries/base  |  Version:  6.6
Severity:  normal  |   Resolution: 
Keywords:  |   Difficulty:  Unknown
  Os:  Windows | Testcase:  readwrite002, hReady001
Architecture:  Unknown |  
---+
Changes (by simonmar):

  * testcase:  readwrite002 = readwrite002, hReady001

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1198#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] #1340: Hpc Documentation

2007-09-26 Thread GHC
#1340: Hpc Documentation
--+-
Reporter:  AndyGill   |Owner:  AndyGill
Type:  merge  |   Status:  closed  
Priority:  high   |Milestone:  6.8.1   
   Component:  Documentation  |  Version:  6.7 
Severity:  normal |   Resolution:  fixed   
Keywords: |   Difficulty:  Moderate (1 day)
  Os:  Unknown| Testcase:  
Architecture:  Unknown|  
--+-
Changes (by igloo):

  * status:  reopened = closed
  * resolution:  = fixed

Comment:

 Merged

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1340#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] #1734: needless panic in :show modules

2007-09-26 Thread GHC
#1734: needless panic in :show modules
+---
Reporter:  guest|Owner:  igloo  
Type:  merge|   Status:  closed 
Priority:  normal   |Milestone: 
   Component:  GHCi |  Version:  6.6.1  
Severity:  normal   |   Resolution:  fixed  
Keywords:   |   Difficulty:  Unknown
  Os:  Unknown  | Testcase: 
Architecture:  Unknown  |  
+---
Changes (by igloo):

  * status:  new = closed
  * resolution:  = fixed

Comment:

 merged

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1734#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] #1391: forkProcess() in Schedule.c with -threaded should initialize mutexes in child process (POSIX)

2007-09-26 Thread GHC
#1391: forkProcess() in Schedule.c with -threaded should initialize mutexes in
child process (POSIX)
---+
Reporter:  thorkilnaur |Owner: 
Type:  bug |   Status:  new
Priority:  high|Milestone:  6.8 branch 
   Component:  Runtime System  |  Version:  6.7
Severity:  normal  |   Resolution: 
Keywords:  |   Difficulty:  Unknown
  Os:  MacOS X | Testcase:  forkprocess01(ghci)
Architecture:  powerpc |  
---+
Comment (by guest):

 With your patch
 {{{
 Fri Sep 14 16:55:19 CEST 2007  Simon Marlow [EMAIL PROTECTED]
   * attempt to fix #1391, hold locks across fork() and initialize them in
 the child
 }}}
 the forkprocess01 test still fails:
 {{{
 $ make TEST=forkprocess01 stage=2 WAY=ghci
 ...
 = forkprocess01(ghci)
 cd .  '/Users/thorkilnaur/tn/GHCDarcsRepository/ghc-HEAD-complete-for-
 pulling-and-copying-20070713_1212/ghc/compiler/stage2/ghc-inplace' -no-
 recomp -dcore-lint -dcmm-lint -Dpowerpc_apple_darwin  forkprocess01.hs
 --interactive -v0 -package unix  forkprocess01.genscript
 1forkprocess01.interp.stdout 2forkprocess01.interp.stderr
 Actual stdout output differs from expected:
 --- ./forkprocess01.stdout.normalised   2007-09-26 20:34:18.0
 +0200
 +++ ./forkprocess01.run.stdout.normalised   2007-09-26
 20:34:18.0 +0200
 @@ -1 +1 @@
 -Just (Exited (ExitFailure 72))
 +Just (Terminated 11)
 *** unexpected failure for forkprocess01(ghci)

 OVERALL SUMMARY for test run started at Wed Sep 26 20:34:14 CEST 2007
7 total tests, which gave rise to
   49 test cases, of which
0 caused framework failures
   48 were skipped

0 expected passes
0 expected failures
0 unexpected passes
1 unexpected failures

 Unexpected failures:
forkprocess01(ghci)

 $
 }}}
 The crash report indicates a problem related to the locks:
 {{{
 **

 Host Name:  Thorkil-Naurs-Computer
 Date/Time:  2007-09-26 21:03:17.246 +0200
 OS Version: 10.4.10 (Build 8R218)
 Report Version: 4

 Command: ghc-6.9.20070925
 Path:/Users/thorkilnaur/tn/GHCDarcsRepository/ghc-HEAD-complete-for-
 pulling-and-copying-20070713_1212/ghc/compiler/stage2/ghc-6.9.20070925
 Parent:  ghc-6.9.20070925 [13662]

 Version: ??? (???)

 PID:13665
 Thread: 0

 Exception:  EXC_BAD_ACCESS (0x0001)
 Codes:  KERN_INVALID_ADDRESS (0x0001) at 0xfffc

 Thread 0 Crashed:
 0   libSystem.B.dylib   0x9002c514 restore_sem_to_pool + 84
 1   libSystem.B.dylib   0x90001c94 pthread_mutex_lock + 604
 2   ghc-6.9.200709250x012af064 waitForReturnCapability + 224
 (crt.c:355)
 3   ghc-6.9.200709250x0117e780 scheduleDoGC + 180 (crt.c:355)
 4   ghc-6.9.200709250x0117ea88 exitScheduler + 96 (crt.c:355)
 5   ghc-6.9.200709250x012a52fc hs_exit_ + 112 (crt.c:355)
 6   ghc-6.9.200709250x012a5428 shutdownHaskellAndExit + 48 (crt.c:355)
 7   0x041425c4 0 + 68429252
 8   ghc-6.9.200709250x0117fa30 schedule + 820 (crt.c:355)
 9   ghc-6.9.200709250x012a37e4 rts_evalStableIO + 72 (crt.c:355)
 10  ghc-6.9.200709250x0117ec6c forkProcess + 368 (crt.c:355)
 11  0x0321c580 0 + 52544896
 12  ghc-6.9.200709250x0117fa30 schedule + 820 (crt.c:355)
 13  ghc-6.9.200709250x0117ff1c workerStart + 88 (crt.c:355)
 14  libSystem.B.dylib   0x9002bd08 _pthread_body + 96

 Thread 1:
 0   0x85d8 __spin_lock_relinquish + 24
 (cpu_capabilities.h:186)
 1   libSystem.B.dylib   0x90001a94 pthread_mutex_lock + 92
 2   ghc-6.9.200709250x012aec68 releaseCapability_ + 296 (crt.c:355)
 3   ghc-6.9.200709250x012af224 yieldCapability + 156 (crt.c:355)
 4   ghc-6.9.200709250x0117e734 scheduleDoGC + 104 (crt.c:355)
 5   ghc-6.9.200709250x0117f7a0 schedule + 164 (crt.c:355)
 6   ghc-6.9.200709250x0117ff1c workerStart + 88 (crt.c:355)
 7   libSystem.B.dylib   0x9002bd08 _pthread_body + 96

 Thread 0 crashed with PPC Thread State 64:
   srr0: 0x9002c514 srr1: 0x0200f030
 vrsave: 0x
 cr: 0x22000224  xer: 0x2000   lr:
 0x9002c4f8  ctr: 0x9002c4c0
 r0: 0x0001   r1: 0xf00fd7d0   r2:
 0x   r3: 0xa000f014
 r4: 0x   r5: 0x   r6:
 0x   r7: 0x
 r8: 0x   r9: 0x  r10:
 0xa000c4c8  r11: 0xfffc
r12: 0x9002c4c0  r13: 0x  r14:
 0x03414079  r15: 0x0048
r16: 0x035ebf61  r17: 0x035eb6dd  r18:
 0x042abb2d  r19: 0x
r20: 0x  r21: 

[GHC] #1740: Haddock 0.8 does not appear to respect module structure

2007-09-26 Thread GHC
#1740: Haddock 0.8 does not appear to respect module structure
--+-
  Reporter:  guest|  Owner: 
  Type:  bug  | Status:  new
  Priority:  normal   |  Milestone: 
 Component:  None |Version:  6.8
  Severity:  normal   |   Keywords: 
Difficulty:  Unknown  | Os:  Unknown
  Testcase:   |   Architecture:  Unknown
--+-
 Haddock seems to ignore the explicit import lists or hiding
 lists of imports. So if you have

 {{{
 module MyModule
 (module MyOtherModule
 ) where

 import MyOtherModule hiding (foo)
 }}}

 or

 {{{
 module MyModule
 (module MyOtherModule
 ) where

 import MyOtherModule(foo)
 }}}

 Everything exported by MyOtherModule is documented
 in the Haddock for MyModule whether of not it's available.
 The resulting Haddock is therefore quite incorrect and
 misleading.

 Yes, I know this isn't a ghc bug, but there seems to be
 nowhere else to report this. So please can we have it
 fixed, not just closed and forgotten about :-)

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