- 07 Jan, 2000 7 commits
-
-
simonmar authored
- set directories using ':=' because the value of $(TOP) can change - remove some old cruft
-
simonmar authored
A few fixups: - correct some addresses - update the mail archive pointers to point to the new archives on mail-archive.com - use <email> tag for email addresses.
-
sewardj authored
storage.c: unZcode tuple types (eg Z4T) correctly (off by one) interface.c(startGHCClass): remember to do dictapsToQualtype on class member types (processInterfaces): return a Bool if Prelude.hi was processed, so we can know when to do everybody(POSTPREL)
-
simonmar authored
Add $(SGML_DOC).tex to $(CLEAN_FILES).
-
sewardj authored
finishGHCModule: correctly create export list entries for non-Names importEntity: allow TUPLE as a kind of TYCON (am dubious about this)
-
sewardj authored
Add a few more symbols to EXTERN_SYMS to track recent GHC Prelude changes.
-
sewardj authored
Remove _fast from macro name gcdIntegerIntzh_fast.
-
- 06 Jan, 2000 5 commits
-
-
sewardj authored
Update Hugs' knowledge of the GHC Prelude to track recent Prelude changes.
-
sewardj authored
Reinstate debug printing, but only only for combined mode.
-
sewardj authored
Remove #ifdef COMPILER, since the contents of this file is now needed by the combined system.
-
sewardj authored
Change NUM_TUPLES to 37, to match GHC.
-
simonmar authored
Fix a bug in inlining that gave unresolved references whenever you compile without -O. Silly me.
-
- 05 Jan, 2000 10 commits
-
-
andy authored
Commenting out the debugging messages for in the new interface code.
-
sewardj 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.
-
simonmar authored
Add test for unterminated ``.
-
simonmar authored
Emit a reasonable error message instead of crashing when there's an unterminated literal-liberal in the source file.
-
sewardj 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.
-
sewardj authored
Fix some serious errors in the handling of instances in interfaces.
-
rrt authored
Changed rules to make SGML documentation using DocBook tools rather than LinuxDoc.
-
rrt authored
VSGML files removed because of conversion from LinuxDoc to DocBook (now have just SGML files).
-
rrt authored
VSGML files changed back to plain SGML during change from LinuxDoc to DocBook.
-
rrt authored
Documentation changed from LinuxDoc to DocBook format, and license added to the user guide.
-
- 04 Jan, 2000 1 commit
-
-
simonpj 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.
-
- 29 Dec, 1999 6 commits
-
-
simonpj authored
Many tweaks to expected output
-
simonpj 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.
-
simonpj authored
Clarification on output files
-
simonpj authored
Improve rn029, remove dup rn033
-
simonpj authored
Fix a renamer bug that rejected import M hiding( C ) where C is a constructor.
-
simonpj authored
Add rn037
-
- 22 Dec, 1999 2 commits
- 21 Dec, 1999 2 commits
-
-
simonmar authored
remove old unused $RTS_PREFIX I just noticed.
-
simonmar 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).
-
- 20 Dec, 1999 7 commits
-
-
lewie authored
Remove *uses* of unused IntAbsOp (see recent log message in prelude/PrimOp).
-
simonmar authored
Remove unused IntAbsOp
-
sewardj 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.
-
simonmar authored
3.02 hi-boot syntax wibble
-
simonpj authored
Forgot to remove PrelNumExtra in the last commit
-
simonpj 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.
-
simonpj authored
wibble
-