Read file fails on Windows

2001-02-22 Thread Meurig Sage
Hi I just installed ghc-4.08.2 on Windows NT. I tried the following program module Main where import System main = do argv <- getArgs case argv of (inp:out:[]) -> do contents <- readFile inp writeFile out contents _ -> putStr "usage_msg " I com

bug in dupChan

2001-01-24 Thread Meurig Sage
Hi I think that there's a bug in dupChan in Chan.lhs   I tried the following program.  main = do chan <- newChan ch <- dupChan chan writeChan chan "done" x <- readChan chan y <- readChan ch prnt ("Got "++x ++" "++y)   Now if I remember correctly this should print "Got done done".   Instea

hello world fails to run on windows

2001-01-22 Thread Meurig Sage
Hi I installed ghc-4.08.1 earlier today on a Windows NT box. I tried out hello world. I compiled with:   ghc -O -static -o main Main.hs   Compilation went fine. But when I tried to run the program it produced no output. I then experimented further. I got TclHaskell up & running and successful

finalisers not being run

1999-12-10 Thread Meurig Sage
Hi, I've got the following program. It depends heavily on finalisers being run regularly as it goes along. I therefore call yield regularly to try to ensure this. This works perfectly under the original ghc-4.04 release, weak pointers are garbage collected and finalisers run regularly. However, w

cvs ghc problems

1999-12-09 Thread Meurig Sage
Hi I compiled up the cvs ghc from yesterday (7 Dec 1999). This was on NT. I had one problem when actually compiling. In config.mk.in line 150 has been changed to: WithGhcHc = $(HC) from WithGhcHc = @WithHc@ This caused circular dependencies when compiling up ghc/compiler.

ghc coredumps with profiling

1999-12-03 Thread Meurig Sage
Hi I compiled up the attached set of files using Tuesday's cvs ghc. It's compiled with -prof -auto-all -caf-all. It runs fine without heap profiling, but core dumps with it. This was running on windows NT. I ran it with the following arguments: main 1000 +RTS -h Meurig crash.tar.gz

compiling cvs from Nov 30

1999-12-01 Thread Meurig Sage
Hi When compiling the cvs ghc and hslibs from Nov 30 I found the following problem. Compiling hslibs/util/Select.lhs failed because it imported posix interface files. ../../ghc/driver/ghc-inplace -syslib concurrent -syslib posix -recomp -cpp -fglasgow-exts -fvia-C -Rghc-timing -O -split-objs -odi

heap profiling with ghc

1999-11-25 Thread Meurig Sage
Hi, I got round yesterday's compilation problem (panic on interface file), by compiling the module Widgets.lhs without -O. The demo program now compiles. It runs normally and will happily give a time profile. ./demos +RTS -pT However, when run with heap profiling ./demos +RTS -hC it crashes wit

cvs ghc crashes when compiling

1999-11-23 Thread Meurig Sage
Hi, I tried compiling a cvs copy of ghc from Monday 22 November. This was on Windows NT. The compiler was compiled using the binary ghc-4.045 binary release. It crashed when compiling PrelBase. ==fptools== make all --unix --

confusing error message

1999-09-10 Thread Meurig Sage
ghc-4.04 gives the following confusing error message: compiling with ghc-4.04 -fglasgow-exts -c Test.hs Test.hs:8: None of the type variable(s) in the constraint `Eq a' appears in the type `Set a -> Set a -> Set a' In the type signature for `unionSets' Compilation had errors mo

Re: getArgs delivers only emty Lists

1999-06-16 Thread Meurig Sage
>Hi, > >fix is available from > > http://www.dcs.gla.ac.uk/~sof/ghc-win32.html > >--sigbjorn > The fix doesn't quite work. Eg running $ghc-4.03 -o main main.hs $./main a b +RTS -H20M ["a","b","+RTS","-H20M"] where main.hs is module Main where import System main = do as <- getArgs print as

Re: Compilation problem with ghc-4.03 win32

1999-06-10 Thread Meurig Sage
> >Add -mno-cygwin to the gcc command line when compiling any .c's. > >--sigbjorn Thanks, that fixed the initial problem but now I've got another one. Running the program causes it to crash with the application error: The instruction at "0x77f6ce0c" referenced memory at "0x0010". The memory

Compilation problem with ghc-4.03 win32

1999-06-10 Thread Meurig Sage
Using the new ghc-4.03 binary snapshot on Windows NT I get the following problem compiling a file. gcc -c tclhaskell.c ghc-4.03 -fglasgow-exts '-#include "tclhaskell.h"' -o main.exe Main.hs tclhaskell.o -ltcl80 -ltk80 tclhaskell.o(.text+0x69):tclhaskell.c: undefined reference to `_impure_ptr' tc

Re: ghc-4.02 crashes with Windows NT - followup

1999-02-26 Thread Meurig Sage
Meurig Sage wrote: > Hi, > I'm using ghc-4.02 on Windows NT. I downloaded the binary installshield > and the cygwin B20.1. I then compiled up a large program. > > The compiled program crashes some of the time with the following error: > ... > This problem goes away i

Re: Segmentation faults with ghc-4.02 code

1999-02-22 Thread Meurig Sage
ilation commands seems to have worked. Sorry for the hassle, Meurig -- Meurig Sage Dept of Computing Science University of Glasgow http://www.dcs.gla.ac.uk/~meurig mailto:[EMAIL PROTECTED]

Segmentation faults with ghc-4.02 code

1999-02-19 Thread Meurig Sage
ar: * write user output in tcl variable *in this way, special tcl characters *like [, $, } etc. are irrelevant for tcl. */ void primSetVar(char *varname, char *inp) { if (tcl_debug) { fprintf(stderr, "set %s %s\n", varname, inp); } Tcl_SetVar(interp, varname, inp, TCL_GLOBAL_ONLY); } -- Meurig Sage Dept of Computing Science University of Glasgow http://www.dcs.gla.ac.uk/~meurig mailto:[EMAIL PROTECTED]

Problem with ghc-4.02

1999-02-11 Thread Meurig Sage
ny ideas? The source files are all bundled up at http://www.dcs.gla.ac.uk/~meurig/TclHaskell.tar.gz Meurig -- Meurig Sage Dept of Computing Science University of Glasgow http://www.dcs.gla.ac.uk/~meurig mailto:[EMAIL PROTECTED]

Re: -monly-N-regs ?

1997-08-06 Thread Meurig Sage
uses. > This happened with me, with ghc-2.04 aswell. Sigbjorn said "the backend is trying to steal more x86 registers than gcc can handle". The solution is to do the following, compile ArrBase separately using: make EXTRA_HC_OPTS=-monly-2-regs ghc/ArrBase.o Then go on with the mak

labelled fields in ghc-2.04

1997-06-12 Thread Meurig Sage
Defined at test2.lhs:3 Defined at test2.lhs:3 Compilation had errors -- -- Meurig Sage Dept of Computing Science University of Glasgow http://www.dcs.gla.ac.uk/~meurig mailto:[EMAIL PROTECTED]

Universally-quantified data type fields

1997-06-12 Thread Meurig Sage
-- What compiler flags am I missing, that I need, to get this to work? Sorry if I'm missing something obvious. Cheers Meurig -- Meurig Sage Dept of Computing Science University of Glasgow http://www.dcs.gla.ac.uk/~meurig mailto:[EMAIL PROTECTED]

Another ghc-2.04 compiling problem

1997-06-12 Thread Meurig Sage
6.hc:2713: warning: initialization makes integer from pointer without a cast /tmp/ghc27506.hc:2713: initializer element is not constant /tmp/ghc27506.hc:2713: warning: data definition has no type or storage class /tmp/ghc27506.hc:2713: parse error before `goto' make[1]: *** [required/System.mr_o

ghc-2.04 compiling problems

1997-06-11 Thread Meurig Sage
; ghc: module version changed to 1; reason: no old .hi file /tmp/ghc27445.hc:953: fixed or forbidden register was spilled. This may be due to a compiler bug or to impossible asm statements or clauses. make[2]: *** [ghc/ArrBase.o] Error 1 make[1]: *** [all] Error 2

Bug in Concurrent Haskell

1997-05-15 Thread Meurig Sage
There's a bug in the signalQSemN function in the Semaphore module. (In versions ghc-0.29 through 2.03). The following function blocks when x=y, but works when y=x-1. f x y = do qSem <- newQSemN 0 forkIO (waitQSemN qSem y) threadDelay 1000 signalQSemN qSem x

compiler bug in ghc-2.02

1997-04-22 Thread Meurig Sage
When compiling the following program, the compiler crashed with a bug. This only happens when compiling with -O. -- module Test where import GlaExts test :: PrimIO () test = ioToPrimIO (putStr "bob") `seqPrimIO` test

problem with syslib hbc and Time in ghc-2.02

1997-04-21 Thread Meurig Sage
I tried compiling a program using -syslib hbc, I wanted Random.lhs, but I required the standard Time library aswell. Unfortunately there's an interface file for hbc called Time.hi, that overrides the haskell 1.4 Time library. I assume this just requires renaming of some of the hbc stuff. Cheers,

mutually recursive modules

1997-04-19 Thread Meurig Sage
Hi, I've been playing around with mutually recursive modules and getting nowhere. I tried the following two module program: - \begin{code} module A where import B data A = A Int findA :: A -> B -> Int findA (A x) (B y) = x \end{code} -

ghc-2.02 strangeness

1997-04-17 Thread Meurig Sage
run successfully. Should I be worried about this? The program was just a simple Hello World program. module Main where main = putStrLn "hello world" Cheers Meurig Sage

RE: Installing greencard

1997-04-15 Thread Meurig Sage
hs Util.lhs Scan.hs Lex.hs Parse.hs ghc-2.02: unrecognised option: -f ghc-2.02: unrecognised option: -- ghc-2.02: unrecognised option: -- Usage: For basic information, try the `-help' option. make: *** [depend] Error 3 make: *** [boot] Error 2 -- From: Sigbjorn Finne Sent: 15 Apr

Installing greencard

1997-04-11 Thread Meurig Sage
Hi, I tried installing greencard on Windows NT and had problems. I picked up the basic binary bundle of ghc and that works ok. I then grabbed greencard. I followed the install file, running configure, and then trying make boot but got the following error message. ../../ghc/driver/ghc -M -opt

ghc-0.29 -prof -concurrent

1997-02-28 Thread Meurig Sage
jects when profiling will *BREAK* if any _scc_s are present! Could this have anything to do with it? Cheers, Meurig Sage

Possible bug in Concurrent Haskell

1997-01-07 Thread Meurig Sage
There seems to be a bug in the Channel module from ghc-0.29. If I understand the description in the paper correctly, dupChan should allow two readers to both read all the data passed along a channel. This doesn't work because of the way the getChan function is written. It takes the next value fr