Re: [GHC] #4034: GHC 6.10 fails to build on PowerPC / MacOS X Leopard (was: GHC 6.12.2 fails to build on PowerPC / MacOS X Leopard)

2010-09-30 Thread GHC
#4034: GHC  6.10 fails to build on PowerPC / MacOS X Leopard
--+-
  Reporter:  PHO  |  Owner: 
  Type:  bug  | Status:  new
  Priority:  low  |  Milestone:  7.0.1  
 Component:  Compiler |Version:  7.1
Resolution:   |   Keywords: 
  Testcase:   |  Blockedby: 
Difficulty:   | Os:  MacOS X
  Blocking:   |   Architecture:  powerpc
   Failure:  Building GHC failed  |  
--+-
Changes (by maeder):

  * version:  6.12.2 = 7.1


Comment:

 Was someone else able to create a newer ghc for ppc? It seems the
 bootstrapping compiler (ghc-6.10) fails to compile ghc-7.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4034#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] #4351: internal error: awaitEvent: descriptor out of range

2010-09-30 Thread GHC
#4351: internal error: awaitEvent: descriptor out of range
-+--
Reporter:  guest |Owner:  simonmar
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.0.1   
   Component:  Runtime System|  Version:  7.1 
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  Other   
-+--
Changes (by simonmar):

  * component:  Compiler = Runtime System
  * failure:  Runtime crash = Other
  * architecture:  x86 = Unknown/Multiple
  * milestone:  = 7.0.1
  * owner:  = simonmar
  * os:  Linux = Unknown/Multiple


Comment:

 Thanks! leaving the ticket open until I've pushed the fix to the error
 message.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4351#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] #4349: ASSERT failed! file compiler/types/FamInstEnv.lhs

2010-09-30 Thread GHC
#4349: ASSERT failed! file compiler/types/FamInstEnv.lhs
--+-
Reporter:  daniel.is.fischer  |Owner: 
Type:  bug|   Status:  new
Priority:  normal |Milestone: 
   Component:  Compiler   |  Version:  7.1
Keywords: | Testcase: 
   Blockedby: |   Difficulty: 
  Os:  Linux  | Blocking: 
Architecture:  x86|  Failure:  Building GHC failed
--+-

Comment(by daniel.is.fischer):

 Seems so. A devel2 build in a fresh tree failed in the same place.

 On another note, should I worry about the core-lint error in GHC.Arr
 mentioned above or is that harmless?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4349#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] #4349: ASSERT failed! file compiler/types/FamInstEnv.lhs

2010-09-30 Thread GHC
#4349: ASSERT failed! file compiler/types/FamInstEnv.lhs
--+-
Reporter:  daniel.is.fischer  |Owner: 
Type:  bug|   Status:  new
Priority:  normal |Milestone: 
   Component:  Compiler   |  Version:  7.1
Keywords: | Testcase: 
   Blockedby: |   Difficulty: 
  Os:  Linux  | Blocking: 
Architecture:  x86|  Failure:  Building GHC failed
--+-

Comment(by simonpj):

 Yes the lint error in `GHC.Arr` is a second mystery.  I assume that
 `GHC.Arr` was compiled with the stage1 compiler when that happened?   No
 Lint error should be left uninvestigated.  I'll try to reproduce it when
 I'm back from ICFP, next week.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4349#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] #3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)

2010-09-30 Thread GHC
#3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)
-+--
Reporter:  zooko |Owner:  
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  _|_ 
   Component:  Compiler  |  Version:  6.11
Keywords:  port sparc64  | Testcase:  
   Blockedby:|   Difficulty:  Unknown 
  Os:  OpenBSD   | Blocking:  
Architecture:  Other |  Failure:  None/Unknown
-+--
Changes (by zooko):

  * failure:  = None/Unknown


Comment:

 Eric Kow has suggested that we add an OpenBSD/Sparc64 buildslave to the
 GHC herd of buildslaves.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3511#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] #4349: ASSERT failed! file compiler/types/FamInstEnv.lhs

2010-09-30 Thread GHC
#4349: ASSERT failed! file compiler/types/FamInstEnv.lhs
--+-
Reporter:  daniel.is.fischer  |Owner: 
Type:  bug|   Status:  new
Priority:  normal |Milestone: 
   Component:  Compiler   |  Version:  7.1
Keywords: | Testcase: 
   Blockedby: |   Difficulty: 
  Os:  Linux  | Blocking: 
Architecture:  x86|  Failure:  Building GHC failed
--+-

Comment(by daniel.is.fischer):

 Right. The command line was
 {{{
 inplace/bin/ghc-stage1   -H64m -O0 -fasm-package-name base-4.3.0.0
  -hide-all-packages -i -ilibraries/base/. -ilibraries/base/dist-
 install/build
  -ilibraries/base/dist-install/build/autogen -Ilibraries/base/dist-
 install/build
  -Ilibraries/base/dist-install/build/autogen -Ilibraries/base/include
  -optP-DOPTIMISE_INTEGER_GCD_LCM -optP-include
  -optPlibraries/base/dist-install/build/autogen/cabal_macros.h
  -package ghc-prim-0.2.0.0 -package integer-gmp-0.2.0.2 -package rts-1.0
  -package-name base -XMagicHash -XExistentialQuantification -XRank2Types
  -XScopedTypeVariables -XUnboxedTuples -XForeignFunctionInterface
 -XUnliftedFFITypes
  -XDeriveDataTypeable -XGeneralizedNewtypeDeriving -XFlexibleInstances
  -XStandaloneDeriving -XPatternGuards -XEmptyDataDecls -XNoImplicitPrelude
 -XCPP
  -no-user-package-conf -rtsopts -O0 -fasm -dcore-lint
  -odir libraries/base/dist-install/build -hidir libraries/base/dist-
 install/build
  -stubdir libraries/base/dist-install/build -hisuf hi -osuf  o
  -hcsuf hc -c libraries/base/./GHC/Arr.lhs -o libraries/base/dist-
 install/build/GHC/Arr.o
 }}}
 The complete log is in build-failure.tar.gz, The compilation of GHC.Arr
 with core-lint warnings and the error is roughly the last two thirds of
 the build log.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4349#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] #3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)

2010-09-30 Thread GHC
#3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)
-+--
Reporter:  zooko |Owner:  
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  _|_ 
   Component:  Compiler  |  Version:  6.11
Keywords:  port sparc64  | Testcase:  
   Blockedby:|   Difficulty:  Unknown 
  Os:  OpenBSD   | Blocking:  
Architecture:  Other |  Failure:  None/Unknown
-+--

Comment(by igloo):

 That would need the port to be bootstrapped first, and for someone to
 volunteer to run the slave.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3511#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] #4355: Coud not deduce (Typeable a) from context (Typeable a, …)

2010-09-30 Thread GHC
#4355: Coud not deduce (Typeable a) from context (Typeable a, …)
-+--
Reporter:  maltem|   Owner: 
Type:  bug   |  Status:  new
Priority:  normal|   Component:  Compiler (Type checker)
 Version:  7.1   |Keywords: 
Testcase:|   Blockedby: 
  Os:  Unknown/Multiple  |Blocking: 
Architecture:  Unknown/Multiple  | Failure:  None/Unknown   
-+--
 Attached is a module containing code from XMonadContrib that does not
 type-check anymore with ghc 7.0.1 rc1. I tried to strip the code somewhat
 down; at least it only depends on base and mtl. Here's the (somewhat
 irritating) error message:

 {{{
 tcBug.hs:50:30:
 Could not deduce (Typeable a)
   from the context (Typeable a, Show ts, HList ts a, LayoutClass l a)
   arising from a use of `fromMessage'
 Possible fix:
   add (Typeable a) to the context of the instance declaration
 In a stmt of a pattern guard for
  an equation for `handleMessage':
 Just (Toggle t) - fromMessage m
 In an equation for `handleMessage':
 handleMessage mt m
   | Just (Toggle t) - fromMessage m,
 i@(Just _) - find (transformers mt) t
   = case currLayout mt of {
   EL l det
 - do { l' - fromMaybe l
 `fmap`
   handleMessage l (SomeMessage
 ReleaseResources);
  }
 where
 cur = (i == currIndex mt) }
   | otherwise
   = case currLayout mt of {
   EL l det
 - fmap (fmap (\ x - mt {currLayout = EL x det}))
  $ handleMessage l m }
 In the instance declaration for `LayoutClass (MultiToggle ts l) a'

 tcBug.hs:51:25:
 Could not deduce (HList ts a)
   from the context (Typeable a,
 Show ts,
 HList ts a,
 LayoutClass l a,
 Transformer t a)
   arising from a use of `find'
 Possible fix:
   add (HList ts a) to the context of
 the data constructor `Toggle'
 or the instance declaration
 In a stmt of a pattern guard for
  an equation for `handleMessage':
 i@(Just _) - find (transformers mt) t
 In a stmt of a pattern guard for
  an equation for `handleMessage':
 Just (Toggle t) - fromMessage m
 In an equation for `handleMessage':
 handleMessage mt m
   | Just (Toggle t) - fromMessage m,
 i@(Just _) - find (transformers mt) t
   = case currLayout mt of {
   EL l det
 - do { l' - fromMaybe l
 `fmap`
   handleMessage l (SomeMessage
 ReleaseResources);
  }
 where
 cur = (i == currIndex mt) }
   | otherwise
   = case currLayout mt of {
   EL l det
 - fmap (fmap (\ x - mt {currLayout = EL x det}))
  $ handleMessage l m }
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4355
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] #4356: type instance doesn't work when the type is (-)

2010-09-30 Thread GHC
#4356: type instance doesn't work when the type is (-)
+---
Reporter:  sjoerd_visscher  |   Owner:   
Type:  bug  |  Status:  new  
Priority:  normal   |   Component:  Compiler (Type checker)  
 Version:  7.1  |Keywords:   
Testcase:   |   Blockedby:   
  Os:  MacOS X  |Blocking:   
Architecture:  x86_64 (amd64)   | Failure:  GHC rejects valid program
+---
 This doesn't work in 7.0.0.20100924.
 It works fine in 6.12.3.

 {-# LANGUAGE TypeFamilies #-}
 type family T t :: * - * - *
 type instance T Bool = (-)
 f :: T Bool Bool Bool
 f = not

 This is the error:

 Couldn't match type `T Bool' with `(-)'
 Expected type: T Bool Bool Bool
   Actual type: Bool - Bool
 In the expression: not
 In an equation for `f': f = not

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4356
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] #4356: type instance doesn't work when the type is (-)

2010-09-30 Thread GHC
#4356: type instance doesn't work when the type is (-)
+---
Reporter:  sjoerd_visscher  |   Owner:   
Type:  bug  |  Status:  new  
Priority:  normal   |   Component:  Compiler (Type checker)  
 Version:  7.1  |Keywords:   
Testcase:   |   Blockedby:   
  Os:  MacOS X  |Blocking:   
Architecture:  x86_64 (amd64)   | Failure:  GHC rejects valid program
+---

Comment(by sjoerd_visscher):

 Should have used preview. Here's the code again:

 {{{
 {-# LANGUAGE TypeFamilies #-}

 type family T t :: * - * - *
 type instance T Bool = (-)

 f :: T Bool Bool Bool
 f = not
 }}}

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


report on 7.01-pre

2010-09-30 Thread Serge D. Mechveliani
Dear GHC developers,

http://botik.ru/pub/local/Mechveliani/ghcBugs/ghc701preBug.zip 

contains a bug report on  ghc-7.0.0.20100924
tested on  Debian Linux, i386-family.

Its essence is as follows. At the fragment of

-
instance (LinSolvRing (Pol a), CommutativeRing a) =  -- (1)
   LinSolvRing (UPol (Pol a))
  where
  gxBasis  []   = ([], [])
  gxBasis  fs@(f:_) =
let
  UPol _ p y dP= f
  (o, n)   = (pPPO p, genericLength $ pVars p)
  (toLex, fromLex) = (reordPol $ lexPPO n, reordPol o)
  p'   = toLex p
  dP'  = upLinSolvRing p' Map.empty
  s' = cToUPol y dP' p'
  ...
-

in the module  Pol3_.hs,  ghc-7.0.0.20100924  reports that 
the line of  `s' ='  needs  (EuclideanRing a)  and that it cannot deduce 
it.

ghc-6.12.2  compiles this in a correct way:
(EuclideanRing a)  is not necessary here, while the context (1) is more 
generic and sufficient.
For example, for  a = DirectSum Integer Integer, 
`a' has the instances (1) and has not the instance of Euclidean, and
the above code must work.
This is the idea of the author of the application; 
this idea is supported by ghc-6.12.2 and not supported by  
ghc-7.0.0.20100924.

There are the two questions.
1) Whether this intention with instances is correct in the meaning of
   Haskell + ghcExt  
   (I hope, it is correct, at least, ghc-6.12.2 accepts it).
2) If it is correct, why   ghc-7.0.0.20100924  requires (Euclidean a) ?

Notices
---  
a) This application uses multiparametric classes and overlapping 
   instances (see docon.cabal for language and other options).
b) The example code can be reduced further, many times.
   But I may have time to reduce it maybe only in the middle of 
   December 2010.

Regards,

-
Serge Mechveliani
mech...@botik.ru
___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)

2010-09-30 Thread GHC
#3511: port GHC to OpenBSD/sparc64 (unregisterised is fine)
-+--
Reporter:  zooko |Owner:  
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  _|_ 
   Component:  Compiler  |  Version:  6.11
Keywords:  port sparc64  | Testcase:  
   Blockedby:|   Difficulty:  Unknown 
  Os:  OpenBSD   | Blocking:  
Architecture:  Other |  Failure:  None/Unknown
-+--

Comment(by aogail):

 Replying to [comment:3 igloo]:
  That would need the port to be bootstrapped first, and for someone to
 volunteer to run the slave.

 I can volunteer to run a build slave on my OpenBSD/sparc64 system.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3511#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] #4355: Coud not deduce (Typeable a) from context (Typeable a, …)

2010-09-30 Thread GHC
#4355: Coud not deduce (Typeable a) from context (Typeable a, …)
+---
Reporter:  maltem   |Owner:  
Type:  bug  |   Status:  new 
Priority:  high |Milestone:  7.0.1   
   Component:  Compiler (Type checker)  |  Version:  7.1 
Keywords:   | Testcase:  
   Blockedby:   |   Difficulty:  
  Os:  Unknown/Multiple | Blocking:  
Architecture:  Unknown/Multiple |  Failure:  None/Unknown
+---
Changes (by igloo):

  * priority:  normal = high
  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4355#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] #4356: type instance doesn't work when the type is (-)

2010-09-30 Thread GHC
#4356: type instance doesn't work when the type is (-)
+---
Reporter:  sjoerd_visscher  |Owner:  simonpj
  
Type:  bug  |   Status:  new
  
Priority:  high |Milestone:  7.0.1  
  
   Component:  Compiler (Type checker)  |  Version:  7.1
  
Keywords:   | Testcase: 
  
   Blockedby:   |   Difficulty: 
  
  Os:  MacOS X  | Blocking: 
  
Architecture:  x86_64 (amd64)   |  Failure:  GHC rejects valid 
program
+---
Changes (by igloo):

  * owner:  = simonpj
  * priority:  normal = high
  * milestone:  = 7.0.1


Old description:

 This doesn't work in 7.0.0.20100924.
 It works fine in 6.12.3.

 {-# LANGUAGE TypeFamilies #-}
 type family T t :: * - * - *
 type instance T Bool = (-)
 f :: T Bool Bool Bool
 f = not

 This is the error:

 Couldn't match type `T Bool' with `(-)'
 Expected type: T Bool Bool Bool
   Actual type: Bool - Bool
 In the expression: not
 In an equation for `f': f = not

New description:

 This doesn't work in 7.0.0.20100924.
 It works fine in 6.12.3.

 {{{
 {-# LANGUAGE TypeFamilies #-}
 type family T t :: * - * - *
 type instance T Bool = (-)
 f :: T Bool Bool Bool
 f = not
 }}}

 This is the error:

 {{{
 Couldn't match type `T Bool' with `(-)'
 Expected type: T Bool Bool Bool
   Actual type: Bool - Bool
 In the expression: not
 In an equation for `f': f = not
 }}}

--

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4356#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] #4253: stage1 compiler uses packages out of the user database

2010-09-30 Thread GHC
#4253: stage1 compiler uses packages out of the user database
--+-
  Reporter:  elliottt |  Owner:
  Type:  bug  | Status:  closed
  Priority:  normal   |  Milestone:  7.0.1 
 Component:  Build System |Version:  6.12.3
Resolution:  fixed|   Keywords:
  Testcase:   |  Blockedby:
Difficulty:   | Os:  Linux 
  Blocking:   |   Architecture:  x86_64 (amd64)
   Failure:  Building GHC failed  |  
--+-
Changes (by igloo):

  * status:  new = closed
  * resolution:  = fixed
  * milestone:  = 7.0.1


Comment:

 Fixed by:
 {{{
 Thu Sep  2 23:47:26 BST 2010  Ian Lynagh ig...@earth.li
   * Add some -no-user-package-conf flags
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4253#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] #4259: Relax restrictions on type family instance overlap

2010-09-30 Thread GHC
#4259: Relax restrictions on type family instance overlap
+---
Reporter:  lilac|Owner:  
Type:  feature request  |   Status:  new 
Priority:  normal   |Milestone:  7.0.1   
   Component:  Compiler (Type checker)  |  Version:  6.12.1  
Keywords:   | Testcase:  
   Blockedby:   |   Difficulty:  
  Os:  Unknown/Multiple | Blocking:  
Architecture:  Unknown/Multiple |  Failure:  None/Unknown
+---
Changes (by igloo):

  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4259#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] #4262: GHC's runtime never terminates unused worker threads

2010-09-30 Thread GHC
#4262: GHC's runtime never terminates unused worker threads
-+--
Reporter:  Remi  |Owner:
 
Type:  bug   |   Status:  new   
 
Priority:  normal|Milestone:  7.0.1 
 
   Component:  Runtime System|  Version:  
6.12.3 
Keywords:  worker thread foreign function interface  | Testcase:
 
   Blockedby:|   Difficulty:
 
  Os:  Unknown/Multiple  | Blocking:
 
Architecture:  Unknown/Multiple  |  Failure:  
Runtime performance bug
-+--
Changes (by igloo):

  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4262#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] #4357: Parallel build broken

2010-09-30 Thread GHC
#4357: Parallel build broken
---+
Reporter:  fw  |   Owner: 
Type:  bug |  Status:  new
Priority:  normal  |   Component:  Build System   
 Version:  6.12.3  |Keywords: 
Testcase:  |   Blockedby: 
  Os:  Linux   |Blocking: 
Architecture:  x86_64 (amd64)  | Failure:  Building GHC failed
---+
 Here is what I did:

 $ tar xf ghc-7.1.20100929-src.tar.bz2
 $ cd ghc-7.1.20100929
 $ perl boot
 [...]
 Booting libraries/unix/
 Can't chmod 0755 darcs-all: No such file or directory at boot line 60.
 $ ./configure --prefix=/opt/ghc
 [...]
 $ nohup make -j10

 nohup.out is attached.  The first error I spotted is:

 /usr/bin/gcc -E-fno-stack-protector  -Iincludes -lm   -MM
 utils/hp2ps/AreaBelow.c -MF utils/hp2ps/dist/build/.depend.c_asm.bit
 [...]
 In file included from includes/ghcconfig.h:5,
  from utils/hp2ps/Main.h:4,
  from utils/hp2ps/AreaBelow.c:1:

 Apparently, includes/ghcplatform.h is read while it is being created.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4357
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] #4267: Missing unboxing in pre-order fold over binary tree

2010-09-30 Thread GHC
#4267: Missing unboxing in pre-order fold over binary tree
-+--
Reporter:  tibbe |Owner:  
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  Compiler  |  Version:  6.13
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4267#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] #4276: -O0 runs in constant space, -O1 and -O2 don't

2010-09-30 Thread GHC
#4276: -O0 runs in constant space, -O1 and -O2 don't
+---
Reporter:  guest|Owner: 
Type:  bug  |   Status:  new
Priority:  normal   |Milestone:  7.2.1  
   Component:  Compiler |  Version:  6.12.1 
Keywords:  optimization space leak  | Testcase: 
   Blockedby:   |   Difficulty: 
  Os:  Windows  | Blocking: 
Architecture:  x86  |  Failure:  Runtime performance bug
+---
Changes (by igloo):

  * milestone:  = 7.2.1


Comment:

 Great testcase, thanks!

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4276#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] #4278: Proposal: Add strict versions of foldlWithKey and insertLookupWithKey to Data.Map

2010-09-30 Thread GHC
#4278: Proposal: Add strict versions of foldlWithKey and insertLookupWithKey to
Data.Map
--+-
Reporter:  tibbe  |Owner: 
Type:  proposal   |   Status:  new
Priority:  normal |Milestone:  Not GHC
   Component:  libraries (other)  |  Version:  6.12.3 
Keywords: | Testcase: 
   Blockedby:  4277   |   Difficulty: 
  Os:  Unknown/Multiple   | Blocking:  4313   
Architecture:  Unknown/Multiple   |  Failure:  Runtime performance bug
--+-
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4278#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] #4281: Make impredicativity work properly

2010-09-30 Thread GHC
#4281: Make impredicativity work properly
-+--
Reporter:  simonpj   |Owner:  simonpj 
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  Compiler  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4281#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] #4282: Proposal: make Data.List.intersperse and intercalate less strict

2010-09-30 Thread GHC
#4282: Proposal: make Data.List.intersperse and intercalate less strict
---+
Reporter:  daniel.is.fischer   |Owner: 
Type:  proposal|   Status:  new
Priority:  normal  |Milestone:  Not GHC
   Component:  libraries/base  |  Version:  6.12.3 
Keywords:  intersperse, laziness, intercalate  | Testcase: 
   Blockedby:  |   Difficulty: 
  Os:  Unknown/Multiple| Blocking: 
Architecture:  Unknown/Multiple|  Failure:  Other  
---+
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4282#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] #4294: hClose003 test failes on Solaris/OpenBSD on i386/x86 host

2010-09-30 Thread GHC
#4294: hClose003 test failes on Solaris/OpenBSD on i386/x86 host
-+--
Reporter:  kgardas   |Owner:  igloo   
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.0.1   
   Component:  Test Suite|  Version:  6.13
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  x86   |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4294#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] #4287: GHC command invocation debug output not in correct format for cmd.exe

2010-09-30 Thread GHC
#4287: GHC command invocation debug output not in correct format for cmd.exe
---+
  Reporter:  ezyang|  Owner:  
  Type:  bug   | Status:  closed  
  Priority:  normal|  Milestone:  
 Component:  Compiler  |Version:  6.12.3  
Resolution:  fixed |   Keywords:  
  Testcase:|  Blockedby:  
Difficulty:| Os:  Windows 
  Blocking:|   Architecture:  Unknown/Multiple
   Failure:  None/Unknown  |  
---+
Changes (by igloo):

  * status:  new = closed
  * resolution:  = fixed


Comment:

 Fixed in HEAD:
 {{{
 Wed Sep 29 00:58:44 BST 2010  Ian Lynagh ig...@earth.li
   * Use showCommandForUser when showing tracing commands
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4287#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] #4295: Review higher-rank and impredicative types

2010-09-30 Thread GHC
#4295: Review higher-rank and impredicative types
-+--
Reporter:  simonpj   |Owner:  simonpj 
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  Compiler  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * owner:  = simonpj
  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4295#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] #4296: The dreaded SkolemOccurs problem

2010-09-30 Thread GHC
#4296: The dreaded SkolemOccurs problem
-+--
Reporter:  simonpj   |Owner:  simonpj   
   
Type:  bug   |   Status:  new   
   
Priority:  normal|Milestone:  7.2.1 
   
   Component:  Compiler  |  Version:  6.12.3
   
Keywords:| Testcase:  
indexed-types/should_compile/Simple20
   Blockedby:|   Difficulty:
   
  Os:  Unknown/Multiple  | Blocking:
   
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown  
   
-+--
Changes (by igloo):

  * owner:  = simonpj
  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4296#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] #4297: `gmake clean' or `gmake distclean' does not clean up testsuite directory

2010-09-30 Thread GHC
#4297: `gmake clean' or `gmake distclean' does not clean up testsuite directory
---+
Reporter:  kgardas |Owner:  igloo
Type:  bug |   Status:  new  
Priority:  normal  |Milestone:  7.0.1
   Component:  Test Suite  |  Version:  6.13 
Keywords:  | Testcase:   
   Blockedby:  |   Difficulty:   
  Os:  Solaris | Blocking:   
Architecture:  x86 |  Failure:  Other
---+
Changes (by igloo):

  * owner:  = igloo
  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4297#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] #4300: :show packages does not list all loaded packages

2010-09-30 Thread GHC
#4300: :show packages does not list all loaded packages
-+--
Reporter:  claus |Owner:  igloo   
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.0.1   
   Component:  GHCi  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * owner:  = igloo
  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4300#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] #4308: LLVM compiles Updates.cmm badly

2010-09-30 Thread GHC
#4308: LLVM compiles Updates.cmm badly
-+--
Reporter:  dterei|Owner:  dterei 
Type:  bug   |   Status:  new
Priority:  normal|Milestone:  7.2.1  
   Component:  Compiler (LLVM)   |  Version:  6.13   
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  x86_64 (amd64)|  Failure:  Runtime performance bug
-+--
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4308#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] #4282: Proposal: make Data.List.intersperse and intercalate less strict

2010-09-30 Thread GHC
#4282: Proposal: make Data.List.intersperse and intercalate less strict
---+
Reporter:  daniel.is.fischer   |Owner: 
Type:  proposal|   Status:  patch  
Priority:  normal  |Milestone:  Not GHC
   Component:  libraries/base  |  Version:  6.12.3 
Keywords:  intersperse, laziness, intercalate  | Testcase: 
   Blockedby:  |   Difficulty: 
  Os:  Unknown/Multiple| Blocking: 
Architecture:  Unknown/Multiple|  Failure:  Other  
---+
Changes (by daniel.is.fischer):

  * status:  new = patch


Comment:

 The proposal was supported by Duncan Coutts, Felipe Lessa, Nicolas
 Pouillard, Christian Maeder and John Lato. No objections were raised.

 Please review and apply.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4282#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] #4310: Deferred equalities and forall types

2010-09-30 Thread GHC
#4310: Deferred equalities and forall types
-+--
Reporter:  simonpj   |Owner:  simonpj 
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  Compiler  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * owner:  = simonpj
  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4310#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] #4313: Proposal: Add left, right and strict folds to Data.Set, Data.IntMap and Data.IntSet to mimic Data.Map.

2010-09-30 Thread GHC
#4313: Proposal: Add left, right and strict folds to Data.Set, Data.IntMap and
Data.IntSet to mimic Data.Map.
--+-
Reporter:  milan  |Owner:  
Type:  task   |   Status:  new 
Priority:  normal |Milestone:  Not GHC 
   Component:  libraries (other)  |  Version:  6.12.3  
Keywords:  containers | Testcase:  
   Blockedby:  4278, 4280 |   Difficulty:  
  Os:  Unknown/Multiple   | Blocking:  
Architecture:  Unknown/Multiple   |  Failure:  None/Unknown
--+-
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4313#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] #4314: Move 'split' from the 'RandomGen' class to a new 'SplittableGen' class

2010-09-30 Thread GHC
#4314: Move 'split' from the 'RandomGen' class to a new 'SplittableGen' class
-+--
Reporter:  TomMD |Owner:  
Type:  proposal  |   Status:  new 
Priority:  normal|Milestone:  Not GHC 
   Component:  libraries/random  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4314#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] #4315: Generalize the 'RandomGen' and 'Random' classes

2010-09-30 Thread GHC
#4315: Generalize the 'RandomGen' and 'Random' classes
-+--
Reporter:  TomMD |Owner:  
Type:  proposal  |   Status:  new 
Priority:  normal|Milestone:  Not GHC 
   Component:  libraries/random  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = Not GHC


Old description:

 RandomGen and Random classes assume generators produce Int values.  This
 is non-ideal as many high speed generators produce special values (ex:
 doubles) or generic values (bit streams / bytestrings) that can be
 converted directly to my types easier than coercing to Int then to an 'a'
 via the Random class.

 The proposal is to change the classes from/to:

 class RandomGen g where

   --

 class RandomGen g v | g - v where

 and

 class Random a where

   --

 class Random a v where

 And make needed changes to the classes instances that follow from these.

New description:

 RandomGen and Random classes assume generators produce Int values.  This
 is non-ideal as many high speed generators produce special values (ex:
 doubles) or generic values (bit streams / bytestrings) that can be
 converted directly to my types easier than coercing to Int then to an 'a'
 via the Random class.

 The proposal is to change the classes from/to:
 {{{
 class RandomGen g where

   --

 class RandomGen g v | g - v where
 }}}
 and
 {{{
 class Random a where

   --

 class Random a v where
 }}}
 And make needed changes to the classes instances that follow from these.

--

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4315#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] #4316: Interactive do notation in GHCi

2010-09-30 Thread GHC
#4316: Interactive do notation in GHCi
-+--
Reporter:  mitar |Owner:  
Type:  feature request   |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  GHCi  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4316#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] #4323: Change implementation of intersectBy

2010-09-30 Thread GHC
#4323: Change implementation of intersectBy
--+-
Reporter:  daniel.is.fischer  |   Owner:
Type:  proposal   |  Status:  patch 
Priority:  normal |   Component:  libraries/base
 Version:  6.12.3 |Keywords:
Testcase: |   Blockedby:
  Os:  Unknown/Multiple   |Blocking:
Architecture:  Unknown/Multiple   | Failure:  None/Unknown  
--+-
Changes (by daniel.is.fischer):

  * status:  new = patch


Comment:

 The proposal was supported by Bas van Dijk and Thomas Schilling, no
 objections were raised.
 [http://haskell.org/pipermail/libraries/2010-September/014300.html Mailing
 list thread]

 Please review and merge.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4323#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] #4318: Crash while building HEAD on OS X

2010-09-30 Thread GHC
#4318: Crash while building HEAD on OS X
---+
Reporter:  gwright |Owner: 
Type:  bug |   Status:  new
Priority:  normal  |Milestone:  7.0.1  
   Component:  Compiler|  Version:  6.13   
Keywords:  | Testcase: 
   Blockedby:  |   Difficulty: 
  Os:  MacOS X | Blocking: 
Architecture:  x86_64 (amd64)  |  Failure:  Building GHC failed
---+
Changes (by igloo):

  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4318#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] #4319: Default to all cores for executables compiled with new flag -multicore

2010-09-30 Thread GHC
#4319: Default to all cores for executables compiled with new flag -multicore
-+--
Reporter:  tim.v2.0  |Owner:  
Type:  feature request   |   Status:  new 
Priority:  normal|Milestone:  7.2.1   
   Component:  Runtime System|  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4319#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] #4320: GHC Build System: make clean on windows requires ./configure to be rerun

2010-09-30 Thread GHC
#4320: GHC Build System: make clean on windows requires ./configure to be rerun
-+--
Reporter:  dterei|Owner:  igloo  
Type:  bug   |   Status:  new
Priority:  normal|Milestone:  7.0.1  
   Component:  Build System  |  Version:  6.13   
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--
Changes (by igloo):

  * owner:  = igloo
  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4320#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] #4323: Change implementation of intersectBy

2010-09-30 Thread GHC
#4323: Change implementation of intersectBy
--+-
Reporter:  daniel.is.fischer  |Owner:  
Type:  proposal   |   Status:  patch   
Priority:  normal |Milestone:  Not GHC 
   Component:  libraries/base |  Version:  6.12.3  
Keywords: | Testcase:  
   Blockedby: |   Difficulty:  
  Os:  Unknown/Multiple   | Blocking:  
Architecture:  Unknown/Multiple   |  Failure:  None/Unknown
--+-
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4323#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] #4329: GHC.Conc modifyTVar primitive

2010-09-30 Thread GHC
#4329: GHC.Conc modifyTVar primitive
---+
Reporter:  dmbarbour   |Owner:  
Type:  feature request |   Status:  new 
Priority:  normal  |Milestone:  7.2.1   
   Component:  Compiler|  Version:  6.12.3  
Keywords:  TVar, STM, modifyTVar, Concurrency  | Testcase:  
   Blockedby:  |   Difficulty:  
  Os:  Unknown/Multiple| Blocking:  
Architecture:  Unknown/Multiple|  Failure:  None/Unknown
---+
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4329#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] #4332: regression: GHCi command output can no longer be redirected on a by-command basis

2010-09-30 Thread GHC
#4332: regression: GHCi command output can no longer be redirected on a 
by-command
basis
-+--
Reporter:  claus |Owner:  
Type:  bug   |   Status:  new 
Priority:  normal|Milestone:  7.0.1   
   Component:  GHCi  |  Version:  6.12.3  
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Windows   | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by igloo):

  * milestone:  = 7.0.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4332#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] #4334: Make lines stricter to fix space leak

2010-09-30 Thread GHC
#4334: Make lines stricter to fix space leak
--+-
Reporter:  daniel.is.fischer  |Owner: 
Type:  proposal   |   Status:  new
Priority:  normal |Milestone:  Not GHC
   Component:  libraries/base |  Version:  6.12.3 
Keywords:  lines, space leak  | Testcase: 
   Blockedby: |   Difficulty: 
  Os:  Unknown/Multiple   | Blocking: 
Architecture:  Unknown/Multiple   |  Failure:  Other  
--+-
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4334#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] #4335: fromRational broken for Ratio a

2010-09-30 Thread GHC
#4335: fromRational broken for Ratio a
--+-
Reporter:  daniel.is.fischer  |Owner: 
Type:  bug|   Status:  new
Priority:  normal |Milestone:  7.2.1  
   Component:  libraries/base |  Version:  6.12.3 
Keywords: | Testcase: 
   Blockedby: |   Difficulty: 
  Os:  Unknown/Multiple   | Blocking: 
Architecture:  Unknown/Multiple   |  Failure:  Incorrect result at runtime
--+-
Changes (by igloo):

  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4335#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] #4336: Better implementation of recip for Ratio a

2010-09-30 Thread GHC
#4336: Better implementation of recip for Ratio a
--+-
Reporter:  daniel.is.fischer  |Owner:  
Type:  proposal   |   Status:  new 
Priority:  normal |Milestone:  Not GHC 
   Component:  libraries/base |  Version:  6.12.3  
Keywords:  recip, Ratio, performance  | Testcase:  
   Blockedby: |   Difficulty:  
  Os:  Unknown/Multiple   | Blocking:  
Architecture:  Unknown/Multiple   |  Failure:  None/Unknown
--+-
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4336#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] #4337: Better power for Rational

2010-09-30 Thread GHC
#4337: Better power for Rational
-+--
Reporter:  daniel.is.fischer |Owner:
 
Type:  proposal  |   Status:  new   
 
Priority:  normal|Milestone:  Not GHC   
 
   Component:  libraries/base|  Version:  6.12.3
 
Keywords:  Rational, power, performance  | Testcase:
 
   Blockedby:|   Difficulty:
 
  Os:  Unknown/Multiple  | Blocking:
 
Architecture:  Unknown/Multiple  |  Failure:  Runtime 
performance bug
-+--
Changes (by igloo):

  * milestone:  = Not GHC


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/4337#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] #4297: `gmake clean' or `gmake distclean' does not clean up testsuite directory

2010-09-30 Thread GHC
#4297: `gmake clean' or `gmake distclean' does not clean up testsuite directory
-+--
  Reporter:  kgardas |  Owner:  igloo  
  Type:  bug | Status:  closed 
  Priority:  normal  |  Milestone:  7.0.1  
 Component:  Test Suite  |Version:  6.13   
Resolution:  fixed   |   Keywords: 
  Testcase:  |  Blockedby: 
Difficulty:  | Os:  Solaris
  Blocking:  |   Architecture:  x86
   Failure:  Other   |  
-+--
Changes (by igloo):

  * status:  new = closed
  * resolution:  = fixed


Comment:

 Running `make test` in the root of the build tree now does the right
 thing.

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