- 12 May, 2000 12 commits
-
-
simonmar authored
The time/allocation profile now shows costs as both - "individual" (incurred by the specific cost-centre stack), and - "inherited" (incurrent by the cost-centre stack and all its children). In addition, the "inner" column has been removed (should be the same as the sum of the scc counts of the children of the current node), and the "caf" column has been removed (wasn't very useful).
-
rrt authored
Clarified comment about SGML_TOP.
-
rrt authored
Changed absolute paths to use SGML_TOP.
-
rrt authored
Added docbook.
-
simonmar authored
add some #ifdefery to suppress warnings.
-
rrt authored
Upped minimum version of GHC required to use new PrelAddr to 405.
-
sewardj authored
First try at support for DietHEP. Has some unfindable bug which causes it to fail when hugs.c is compiled -O; works fine without -O.
-
rrt authored
Remove reference to dLL_ifs.hi (was being specifically ignored in preprocess_include_dirs).
-
rrt authored
Fix install rules for _imp libraries under Windows. They must only be installed if EnableWin32Dlls is YES, but not in the dll way (otherwise a spurious _dll is inserted into the library name).
-
simonmar authored
integerToWord64 only started working properly yesterday (!), so don't include folding on word bitops in pre-4.07 GHCs.
-
panne authored
Don't try to install import libraries if way /= dll
-
simonmar authored
versionitis: pre-4.06 GHCs didn't have PrelAddr.intToWord
-
- 11 May, 2000 13 commits
-
-
rrt authored
Rename From*Bounded functions to boundedFrom* for consistency with numericFrom*
-
rrt authored
Corrected use of patsubst.
-
simonmar authored
add links to FFI stuff.
-
simonmar authored
First cut at 4.07's release notes.
-
panne authored
Added rules for constant folding with the folloging ops: WordQuotOp, WordRemOp, AndOp, OrOp, XorOp, Int2AddrOp, Addr2IntOp, Float2IntOp, DoubleNegOp, Double2IntOp, Double2FloatOp, Float2DoubleOp
-
simonmar authored
Try to avoid clashes with files already in $TMPDIR.
-
simonmar authored
Don't open with O_NONBLOCK, instead open in blocking mode and set O_NONBLOCK subsequently with fcntl(). This appears to fix the problems with FIFOs. Pick one of the following: - the semantics as implemented by Linux & Solaris is broken - the POSIX semantics is broken - our expectation that things should behave sensibly is unreasonable
-
rrt authored
Make gmp DLL in DLL way (wasn't being made at all before).
-
simonmar authored
StablePtrRep is now more like a pointer than an integer, so use the correct union tag when assigning one to a register to avoid warnings.
-
rrt authored
Fix installing for DLLized Windows build.
-
rrt authored
Removed dLL_ifs.hi from INSTALL_DATA under Windows (no longer exists).
-
andy authored
Wibble... The corrected example is as follows: myS :: (forall t t1 t2. (t -> t2 -> t1) -> (t -> t2) -> t -> t1) [NoDiscard] __AL 3 myS = \ @ t @ t1 @ t2 f :: (t -> t2 -> t1) g :: (t -> t2) x :: t -> f x (g x) public class myS implements Code { public Object ENTER () { VM.COLLECT(3, this); final Object f = VM.POP(); final Object g = VM.POP(); final Object x = VM.POP(); VM.PUSH(x); VM.PUSH(new Thunk(new myS$1(g, x))); return f; } } class myS$1 extends Code { final Object g; final Object x; public myS$1 (Object _g_, Object _x_) { g = _g_; x = _x_; } public Object ENTER () { VM.PUSH(x); return g; } }
-
andy authored
First attempt at at class lifter for the GHC GOO backend. This included a cleanup of the Java/GOO abstract syntax - Name is now a string, not a list of string - Type is used instead of name in some places (for example, with new) - other minor tweeks. Andy --------- Example for myS f g x = f x (g x) public class myS implements Code { public Object ENTER () { VM.COLLECT(3, this); final Object f = VM.POP(); final Object g = VM.POP(); final Object x = VM.POP(); VM.PUSH(x); VM.PUSH(new Thunk(new Code(g, x))); return f; } } class myS$1 { final Object g; final Object x; public myS$1 (Object _g_, Object _x_) { g = _g_; x = _x_; } public Object ENTER () { VM.PUSH(x); return g; } }
-
- 10 May, 2000 15 commits
-
-
sewardj authored
Reinstate the bytecode peephole optimiser.
-
sewardj authored
findFilesForModule: search default library directories before looking at user-supplied search paths.
-
panne authored
More RULES for coercions and truncate.
-
rrt authored
Temporarily removed i018 test on mingw
-
rrt authored
Omitted some tests on mingw.
-
rrt authored
Omitted some tests on mingw (conc020 *should* work, but doesn't).
-
simonmar authored
compile CType.lhs via-C, since the NCG's register allocator seems to behave suboptimally when presented with the huge switch in this file.
-
simonmar authored
Use the native code generator by default for compilations without -O.
-
simonmar authored
Add tryTakeMVar test.
-
rrt authored
Removed LITERATE, added DOCBOOK_PREFIX, and improved some comments.
-
rrt authored
DocBook scripts from Cygnus DocBook tools; the first visible sign of freedom from the tyranny of RPMs.
-
rrt authored
Tried to bring this test into the modern age. Failed. I've committed the pieces to be picked up later.
-
simonmar authored
Put back the '$(RM) $@' in the rule for building library modules when splitting, until we fix this problem properly.
-
keithw authored
Add comment noting that StgLint is currently broken.
-
simonmar authored
rename takeMaybeMVar to tryTakeMVar
-