profiling (again)

Hal Daume III hdaume@ISI.EDU
Wed, 1 May 2002 12:50:32 -0700 (PDT)


Well, I think I've narrowed the problem down to Binary...the following
program crashed when profiled:

module Main
    where

import Binary
import IO

main = 
    do h <- openFile "foo" WriteMode
       b <- openBinIO_ h
       put_ b 'a'
       hClose h

Any suggestions (or new versions of Binary :P)?

--
Hal Daume III

 "Computer science is no more about computers    | hdaume@isi.edu
  than astronomy is about telescopes." -Dijkstra | www.isi.edu/~hdaume

On Wed, 1 May 2002, Hal Daume III wrote:

> i'm using ghc 5.02.1 for sparc solaris
> 
> --
> Hal Daume III
> 
>  "Computer science is no more about computers    | hdaume@isi.edu
>   than astronomy is about telescopes." -Dijkstra | www.isi.edu/~hdaume
> 
> _______________________________________________
> Glasgow-haskell-users mailing list
> Glasgow-haskell-users@haskell.org
> http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
>