Re: [GHC] #1876: Complete shared library support

2009-02-22 Thread GHC
#1876: Complete shared library support
-+--
Reporter:  simonmar  |Owner:  clemens   
Type:  task  |   Status:  assigned  
Priority:  high  |Milestone:  6.10 branch   
   Component:  Compiler  |  Version:  6.8.1 
Severity:  normal|   Resolution:
Keywords:|   Difficulty:  Difficult (1 week)
Testcase:|   Os:  Unknown/Multiple  
Architecture:  Unknown/Multiple  |  
-+--
Changes (by NeilMitchell):

 * cc: ndmitch...@gmail.com (added)

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1876#comment:16
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #3035: :steplocal and :stepmodule should not polute trace history

2009-02-22 Thread GHC
#3035: :steplocal and :stepmodule should not polute trace history
--+-
 Reporter:  phercek   |  Owner:  mnislaih
 Type:  bug   | Status:  assigned
 Priority:  normal|  Milestone:  
Component:  GHCi  |Version:  6.10.1  
 Severity:  normal| Resolution:  
 Keywords:  debugger  |   Testcase:  
   Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
--+-
Changes (by mnislaih):

  * status:  new = assigned
  * owner:  = mnislaih
 * cc: pher...@gmail.com, mnisl...@gmail.com (added)

Comment:

 Peter, this patch is against HEAD, right ?
 It looks like cannot apply it because of a darcs bug. *Sigh*

 After trying both with darcs1 and darcs2 on a clean ghc, I give up.
 Would you mind to attach a manual patch instead?

 Thanks.

 {{{
 p...@ender4:~/scratch/ghc.head$ darcs1 apply
 ../ghc.phercek/traceOnlyStops.dpatch
 darcs1: bug in get_extra commuting patch:
 Sat Sep 20 17:57:22 CEST 2008  Ian Lynagh ig...@earth.li
   * Add library release notes

 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3035#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] #1876: Complete shared library support

2009-02-22 Thread GHC
#1876: Complete shared library support
-+--
Reporter:  simonmar  |Owner:  clemens   
Type:  task  |   Status:  assigned  
Priority:  high  |Milestone:  6.10 branch   
   Component:  Compiler  |  Version:  6.8.1 
Severity:  normal|   Resolution:
Keywords:|   Difficulty:  Difficult (1 week)
Testcase:|   Os:  Unknown/Multiple  
Architecture:  Unknown/Multiple  |  
-+--
Changes (by guest):

 * cc: bulat.zigans...@gmail.com (added)

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1876#comment:17
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #3042: rts defines real_main which can clash with user C code

2009-02-22 Thread GHC
#3042: rts defines real_main which can clash with user C code
-+--
Reporter:  duncan|  Owner:  
Type:  bug   | Status:  new 
Priority:  normal|  Component:  Runtime System  
 Version:  6.10.1|   Severity:  normal  
Keywords:|   Testcase:  
  Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
-+--
 I was just about to file a bug about `ghc -no-hs-main` not working but it
 turns out it is just because I had a `real_main` C function in my `.c`
 file. This ends up clashing with the C function of the same name from the
 rts package. This means that when linking we pull in the wrong one and the
 rts one needs `__stginit_ZCMain` and `ZCMain_main_closure` which is what
 the linker error message reports (which is rather confusing).

 Suggestion: rename the rts `real_main` to something less likely to clash
 with user code.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3042
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] #3042: rts defines real_main which can clash with user C code

2009-02-22 Thread GHC
#3042: rts defines real_main which can clash with user C code
--+-
 Reporter:  duncan|  Owner:  
 Type:  bug   | Status:  new 
 Priority:  normal|  Milestone:  
Component:  Runtime System|Version:  6.10.1  
 Severity:  normal| Resolution:  
 Keywords:|   Testcase:  
   Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
--+-
Comment (by duncan):

 see also http://hackage.haskell.org/trac/hackage/ticket/504

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3042#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] #3043: An unrelated definition monomorphizes a type even without the MR

2009-02-22 Thread GHC
#3043: An unrelated definition monomorphizes a type even without the MR
-+--
Reporter:  Deewiant  |  Owner: 
Type:  bug   | Status:  new
Priority:  normal|  Component:  Compiler (Type checker)
 Version:  6.10.1|   Severity:  normal 
Keywords:|   Testcase: 
  Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple   
-+--
 The following code:
 {{{
 {-# LANGUAGE NoMonomorphismRestriction #-}
 {-# LANGUAGE MultiParamTypeClasses, FlexibleInstances,
 FunctionalDependencies #-}

 class Id a b | b - a where id' :: a - b
 instance Id [Char] [Char] where id' = id

 class Fst a where fst' :: a - String
 instance Fst ([Char],a) where fst' = fst

 data Void a = Void

 void :: (String,a) - Void a
 void _ = Void

 fst'' (a,b) =
   let x = (id' a, b)
   y = void x :: Void Int -- remove this line and the code compiles
in fst' x
 }}}
 Results in:
 {{{
 arst.hs:18:6:
 No instance for (Fst (b, Int))
   arising from a use of `fst'' at arst.hs:18:6-11
 Possible fix: add an instance declaration for (Fst (b, Int))
 In the expression: fst' x
 In the expression:
 let
   x = (id' a, b)
   y = void x :: Void Int
 in fst' x
 In the definition of `fst''':
 fst'' (a, b)
 = let
 x = ...
 y = ...
   in fst' x

 arst.hs:18:11:
 No instance for (Id [Char] b)
   arising from a use of `x' at arst.hs:18:11
 Possible fix: add an instance declaration for (Id [Char] b)
 In the first argument of `fst'', namely `x'
 In the expression: fst' x
 In the expression:
 let
   x = (id' a, b)
   y = void x :: Void Int
 in fst' x
 }}}

 It seems that the definition of `y` locks down the type of `x` somewhat
 even though the monomorphism restriction is disabled. If we remove the
 definition:
 {{{
 *Main :t fst''
 fst'' :: (Id t b, Fst (b, t1)) = (t, t1) - String
 }}}

 To be completely honest I'm not sure whether the code should be accepted
 or not, since `(Id t b, Fst (b, t1))` can't be satisfied. Only the fully
 monomorphic signature `([Char], Int) - String`, which is obtained with
 the definition of `y` in place and the monomorphism restriction enabled,
 works.

 In any case, I think it's a bug that the results of the type check depend
 on whether `y` is defined or not: surely that shouldn't matter at all, no
 matter what the end result is.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3043
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] #3035: :steplocal and :stepmodule should not polute trace history

2009-02-22 Thread GHC
#3035: :steplocal and :stepmodule should not polute trace history
--+-
 Reporter:  phercek   |  Owner:  igloo   
 Type:  merge | Status:  new 
 Priority:  normal|  Milestone:  
Component:  GHCi  |Version:  6.10.1  
 Severity:  normal| Resolution:  
 Keywords:  debugger  |   Testcase:  
   Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
--+-
Changes (by mnislaih):

  * owner:  Igloo = igloo

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/3035#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] #1377: GHCi debugger tasks

2009-02-22 Thread GHC
#1377: GHCi debugger tasks
-+--
Reporter:  simonmar  |Owner:  igloo   
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  6.10 branch 
   Component:  GHCi  |  Version:  6.7 
Severity:  normal|   Resolution:  
Keywords:|   Difficulty:  Unknown 
Testcase:|   Os:  Unknown/Multiple
Architecture:  Unknown/Multiple  |  
-+--
Changes (by mnislaih):

  * owner:  = igloo

Comment:

 Validated and pushed
 {{{
 Sun Feb 22 20:55:51 CET 2009  Peter Hercek pher...@gmail.com
   * Do not print anything to stdout when stopping at a breakpoint with
 custom code attached
 }}}

 Ian, this patch can be merged to 6.10, but do not close the ticket yet.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/1377#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] #3031: -fwarn-unrecognised-pragmas is not documented

2009-02-22 Thread GHC
#3031: -fwarn-unrecognised-pragmas is not documented
-+--
Reporter:  simonmar  |Owner:  igloo   
Type:  bug   |   Status:  new 
Priority:  high  |Milestone:  6.10.2  
   Component:  Documentation |  Version:  6.10.1  
Severity:  normal|   Resolution:  
Keywords:|   Difficulty:  Easy (1 hr) 
Testcase:|   Os:  Unknown/Multiple
Architecture:  Unknown/Multiple  |  
-+--
Changes (by igloo):

  * owner:  = igloo

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