#3579: Error: symbol `Bug_compose1_closure' is already defined
-------------------------------+--------------------------------------------
  Reporter:  igloo             |          Owner:                  
      Type:  bug               |         Status:  new             
  Priority:  high              |      Milestone:  6.12.1          
 Component:  Compiler          |        Version:  6.13            
  Severity:  normal            |       Keywords:                  
Difficulty:  Unknown           |       Testcase:                  
        Os:  Unknown/Multiple  |   Architecture:  Unknown/Multiple
-------------------------------+--------------------------------------------
 In http://www.haskell.org/pipermail/glasgow-haskell-
 bugs/2009-October/020608.html Serge reports:

 {{{
 module Bug where

 compose :: [a -> a] -> a -> a
 compose =  foldr (.) id

 class Compose a where
     compose1 :: a -> a -> a
 }}}

 {{{
 $ ghc -c -O p.hs
 /tmp/ghc12944_0/ghc12944_0.s: Assembler messages:

 /tmp/ghc12944_0/ghc12944_0.s:22:0:
      Error: symbol `Bug_compose1_closure' is already defined

 /tmp/ghc12944_0/ghc12944_0.s:98:0:
      Error: symbol `Bug_compose1_info' is already defined
 }}}

-- 
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/3579>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to