- Jan 07, 2000
-
-
Julian Seward authored
finishGHCModule: correctly create export list entries for non-Names importEntity: allow TUPLE as a kind of TYCON (am dubious about this)
-
Julian Seward authored
Add a few more symbols to EXTERN_SYMS to track recent GHC Prelude changes.
-
Julian Seward authored
Remove _fast from macro name gcdIntegerIntzh_fast.
-
- Jan 06, 2000
-
-
Julian Seward authored
Update Hugs' knowledge of the GHC Prelude to track recent Prelude changes.
-
Julian Seward authored
Reinstate debug printing, but only only for combined mode.
-
Julian Seward authored
Remove #ifdef COMPILER, since the contents of this file is now needed by the combined system.
-
Julian Seward authored
Change NUM_TUPLES to 37, to match GHC.
-
Simon Marlow authored
Fix a bug in inlining that gave unresolved references whenever you compile without -O. Silly me.
-
- Jan 05, 2000
-
-
AndyGill authored
Commenting out the debugging messages for in the new interface code.
-
Julian Seward authored
Fix more interface-reading bugs: -- Qualtypes were not being generated from DICTAPs for overloaded non-class values. New function dictapsToQualtype to handle this. -- Incorrect construction of constructor result type in startGHCDataDecl for parameterised types eg Just :: a -> Maybe a. Changed meaning of DICTAP, so that the construction is ap(DICTAP, (QConId, Type)) rather than ap(DICTAP, (QConId, [Type])). Will have to undo this if we want to support multiparam type classes.
-
Simon Marlow authored
Add test for unterminated ``.
-
Simon Marlow authored
Emit a reasonable error message instead of crashing when there's an unterminated literal-liberal in the source file.
-
Julian Seward authored
Remember to add entities to module(m).names/.tycons/.classes as well as to module(m).exports. Otherwise the 'eval environment' will be wrong. Add assertions in storage.c for addName/addTycon/addClass.
-
Julian Seward authored
Fix some serious errors in the handling of instances in interfaces.
-
Reuben Thomas authored
Changed rules to make SGML documentation using DocBook tools rather than LinuxDoc.
-
Reuben Thomas authored
VSGML files removed because of conversion from LinuxDoc to DocBook (now have just SGML files).
-
Reuben Thomas authored
VSGML files changed back to plain SGML during change from LinuxDoc to DocBook.
-
Reuben Thomas authored
Documentation changed from LinuxDoc to DocBook format, and license added to the user guide.
-
- Jan 04, 2000
-
-
Simon Peyton Jones authored
This commit arranges that literal strings will fuse nicely, by expressing them as an application of build. * NoRepStr is now completely redundant, though I havn't removed it yet. * The unpackStr stuff moves from PrelPack to PrelBase. * There's a new form of Rule, a BuiltinRule, for rules that can't be expressed in Haskell. The string-fusion rule is one such. It's defined in prelude/PrelRules.lhs. * PrelRules.lhs also contains a great deal of code that implements constant folding. In due course this will replace ConFold.lhs, but for the moment it simply duplicates it.
-
- Dec 29, 1999
-
-
Simon Peyton Jones authored
Many tweaks to expected output
-
Simon Peyton Jones authored
Set MKDEPENDHS to $(HC) instead of $(GHC). This means that dependencies will be computed with the same compiler as compilations, which is presumably the right thing.
-
Simon Peyton Jones authored
Clarification on output files
-
Simon Peyton Jones authored
Improve rn029, remove dup rn033
-
Simon Peyton Jones authored
Fix a renamer bug that rejected import M hiding( C ) where C is a constructor.
-
Simon Peyton Jones authored
Add rn037
-
- Dec 22, 1999
-
-
Simon Marlow authored
Remove more vestiges of IntAbsOp, and now unused absIntCode.
-
Simon Marlow authored
Add comment about TMPDIR.
-
- Dec 21, 1999
-
-
Simon Marlow authored
remove old unused $RTS_PREFIX I just noticed.
-
Simon Marlow authored
Hopefully banish bogus "Happy version 1.6 or later is required to compile GHC" messages. The new rule is: if you don't have an installed copy of Happy, but have a Happy source tree, we point the build system at the latter (and pull the version number out of happy/mk/version.mk).
-
- Dec 20, 1999
-
-
Jeff Lewis authored
Remove *uses* of unused IntAbsOp (see recent log message in prelude/PrimOp).
-
Simon Marlow authored
Remove unused IntAbsOp
-
Julian Seward authored
* Fix silly bugs in new linker, object.[ch]. * Allow modules to have arbitrary numbers of "extra" object files as well as their primary object file. Initial requirement is that Prelude needs libHS_cbits.o/.dll as well as Prelude.o module(m).object is the primary object module(m).objectExtras are the extra objects module(m).objectExtraNames :: [Text] are their names. Modify machdep.c to assume that extra objects for module M live in the same directory as M's primary object. * Stuff 130ish symbol names into the RTS symbol table, enough so that the whole Prelude can be linked. That includes symbols in the C library needed by libHS_cbits. This is very hacky and needs to be fixed properly.
-
Simon Marlow authored
3.02 hi-boot syntax wibble
-
Simon Peyton Jones authored
Forgot to remove PrelNumExtra in the last commit
-
Simon Peyton Jones authored
This commit implements a substantial re-organisation of the Prelude It also fixes a couple of small renamer bugs that were reported recently (notably, Sven pointed out that we weren't reporting unused imports properly) My original goal was to get rid of all "orphan" modules (i.e. ones with instance decls that don't belong either to a tycon or a class defined in the same module). This should reduce the number of interface files that have to be read when compiling small Haskell modules. But like most expeditions into the Prelude Swamp, it spiraled out of control. The result is quite satisfactory, though. GONE AWAY: PrelCCall, PrelNumExtra NEW: PrelReal, PrelFloat, PrelByteArr, PrelNum.hi-boot (The extra PrelNum.hi-boot is because of a tiresome thin-air Id, addr2Integer, which used to be in PrelBase.) Quite a lot of types have moved from one module to another, which entails some changes to part of the compiler (PrelInfo, PrelMods) etc, and there are a few places in the RTS includes and even in the driver that know about these home modules (alas). So the rough structure is as follows, in (linearised) dependency order [this list now appears in PrelBase.lhs] PrelGHC Has no implementation. It defines built-in things, and by importing it you bring them into scope. The source file is PrelGHC.hi-boot, which is just copied to make PrelGHC.hi Classes: CCallable, CReturnable PrelBase Classes: Eq, Ord, Functor, Monad Types: list, (), Int, Bool, Ordering, Char, String PrelTup Types: tuples, plus instances for PrelBase classes PrelShow Class: Show, plus instances for PrelBase/PrelTup types PrelEnum Class: Enum, plus instances for PrelBase/PrelTup types PrelMaybe Type: Maybe, plus instances for PrelBase classes PrelNum Class: Num, plus instances for Int Type: Integer, plus instances for all classes so far (Eq, Ord, Num, Show) Integer is needed here because it is mentioned in the signature of 'fromInteger' in class Num PrelReal Classes: Real, Integral, Fractional, RealFrac plus instances for Int, Integer Types: Ratio, Rational plus intances for classes so far Rational is needed here because it is mentioned in the signature of 'toRational' in class Real Ix Classes: Ix, plus instances for Int, Bool, Char, Integer, Ordering, tuples PrelArr Types: Array, MutableArray, MutableVar Does *not* contain any ByteArray stuff (see PrelByteArr) Arrays are used by a function in PrelFloat PrelFloat Classes: Floating, RealFloat Types: Float, Double, plus instances of all classes so far This module contains everything to do with floating point. It is a big module (900 lines) With a bit of luck, many modules can be compiled without ever reading PrelFloat.hi PrelByteArr Types: ByteArray, MutableByteArray We want this one to be after PrelFloat, because it defines arrays of unboxed floats. Other Prelude modules are much easier with fewer complex dependencies.
-
Simon Peyton Jones authored
wibble
-
Simon Peyton Jones authored
Fix a gotcha in the interface-file post processing that led to bizarre omissions from interface files when working with existential types. That's what you get for using Perl
-
- Dec 17, 1999
-
-
Julian Seward authored
Reorganised object code loader/linker to make it much more modular and cleaner. All the machinery is now in object.[ch]. This stuff is packaged up as close to a standalone library as I can reasonably get it -- in particular, it knows nothing about Hugs -- so that the linker could easily be used in some entirely different application with almost no changes, if we so desire. Minor mods to interface.c & storage.c to use the new linker API.
-
Simon Marlow authored
Add netbsd to the list of platforms supported. ToDo: add info to the User's Guide once the Shiny New Documentation is committed.
-
- Dec 16, 1999
-
-
Julian Seward authored
Add extended version of previous commit message as a comment.
-