Bugs item #707763, was opened at 2003-03-21 14:24
You can respond by visiting: 
https://sourceforge.net/tracker/?func=detail&atid=108032&aid=707763&group_id=8032

Category: Profiling
Group: 5.04.2
Status: Open
Resolution: None
Priority: 5
Submitted By: E Nedervold (nedervold)
Assigned to: Nobody/Anonymous (nobody)
Summary: Link fails when trying to generate a profiling executable

Initial Comment:
Bug generating profiling code:

Link fails when trying to generate a profiling executable.  I'm
running on MacOS X.  Output and source below.  The bug 
doesn't occur when all the code is in a single module.

------------------------------------------------------------

ghc --make -prof Tmp2.hs
ghc-5.04.2: chasing modules from: Tmp2.hs
Compiling Tmp              ( Tmp.hs, Tmp.o )
Compiling Main             ( Tmp2.hs, ./Tmp2.o )
ghc: linking ...
ld: Undefined symbols:
_GHCziHandle_ReadMode_static_info

::::::::::::::
Tmp.hs
::::::::::::::
module Tmp where

import System.IO

name = "Tmp.hs"

main' = do
    h <- openFile name ReadMode
    inp <- hGetContents h
    putStr "Here it is: "
    putStr inp
    

::::::::::::::
Tmp2.hs
::::::::::::::
module Main where

import Tmp

main = main'

----------------------------------------------------------------------

You can respond by visiting: 
https://sourceforge.net/tracker/?func=detail&atid=108032&aid=707763&group_id=8032
_______________________________________________
Glasgow-haskell-bugs mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to