- 07 May, 2003 2 commits
- 06 May, 2003 7 commits
-
-
simonpj authored
Note about context in data type decls
-
simonmar authored
Update: we now follow Haskell 98 w.r.t. exports from module Main.
-
simonpj authored
------------------------------------- Implement deriving( Data ) ------------------------------------- Implements deriving( Data ), where the Data class is defined in Data.Generics; its the "scrap your boilerplate" Term class. Ralf is still converging on the exact definition of the Data class, so the details may change.
-
simonpj authored
Import wibbles
-
simonpj authored
------------------------------------- Main module exports ------------------------------------- Make it so that module Main where .... exports everything defined in Main, as the report says it should.
-
simonpj authored
Formatting only
-
simonpj authored
Comments about eta expansion
-
- 04 May, 2003 1 commit
-
-
igloo authored
Add support for unboxed Ints, Floats and Doubles to Template Haskell.
-
- 01 May, 2003 3 commits
-
-
ross authored
Make -t option to the script override the template file, just as -c overrides the compiler, as the the documentation implies. (Formerly -t added an extra template file, which is not so useful.)
-
simonmar authored
Use the DocBook 4.1 DTD instead of 3.1. Seems to work fine...
-
simonmar authored
Remove special cases for the setting of $(libdir) and $(datadir) on mingw32, after discussion with Sigbjorn.
-
- 29 Apr, 2003 2 commits
- 28 Apr, 2003 3 commits
-
-
simonmar authored
Add a compile-time sanity check that RESERVED_STACK_WORDS is right.
-
simonmar authored
Comments to note the relationship between the RET_DYN stack frame size and RESERVED_STACK_WORDS.
-
simonmar authored
Following the recent change to the layout of the StgRetDyn frame, we now need to bump RESERVED_STACK_WORDS because this governs the amount of room which is guaranteed to be available on the stack in the event of a stack check failure. This accounts for at least one cause of recent crashes in the HEAD.
-
- 27 Apr, 2003 2 commits
- 25 Apr, 2003 2 commits
- 23 Apr, 2003 2 commits
- 22 Apr, 2003 4 commits
-
-
igloo authored
Order declarations in reifications in order of source line number. The bugs still there but it bites less often now... Also remove the type parameterisation and do some type renaming as discussed on the template-haskell list.
-
simonmar authored
Fix an obscure bug: the most general kind of heap check, HEAP_CHECK_GEN(), is supposed to save the contents of *every* register known to the STG machine (used in cases where we either can't figure out which ones are live, or doing so would be too much hassle). The problem is that it wasn't saving the L1 register. A slight complication arose in that saving the L1 register pushed the size of the frame over the 16 words allowed for the size of the bitmap stored in the frame, so I changed the layout of the frame a bit. Describing all the registers using a single bitmap is overkill when only 8 of them can actually be pointers, so now the bitmap is only 8 bits long and we always skip over a fixed number of non-ptr words to account for all the non-ptr regs. This is all described in StgMacros.h.
-
simonpj authored
Fix the context for derived Typeable instances
-
simonpj authored
Stage-2 wibbles to the Expected type changes
-
- 21 Apr, 2003 1 commit
-
-
sof authored
drop curious *_debug_opts_prefix tables; no longer used
-
- 18 Apr, 2003 2 commits
-
-
simonmar authored
Add a comment about the entry convention to stg_ap_* and why it's done this way (thanks to Andy Moran for the prodding).
-
simonmar authored
Just noticed that all the stack checks in stg_ap_[1-8]_entry are too low by one word. Thanks to Andy Moran for (unwittingly) causing me peer at this code.
-
- 17 Apr, 2003 5 commits
-
-
simonpj authored
---------------------------------- Implement Typeable properly ---------------------------------- 1. Add 'deriving' for Typeable class. So you can say data T a b = .... deriving( Typeable ) At the moment you only get this if you ask for it. If you say nothing you get nothing. 2. Implement Typeable better, with proper O(1) comparison of type representations 3. Add the 'cast' operation described in 'Scrap your boilerplate' and use it. 4. Consequence: need to move the definition of IOArray from Data.Array.IO.Internals to GHC.IOBase, where it joins IORef. This is necssary so that HashTable can be low down in the compilation hierarchy, and hence so can Dynamic. WARNING: I'm not certain the imports in HashTable and Dynamic will all be right for Hugs and NHC. I hope you can fix them up.
-
simonpj authored
Comments
-
simonpj authored
Comments
-
simonmar authored
Comment fix
-
simonpj authored
Update hi-boot files
-
- 16 Apr, 2003 1 commit
-
-
simonpj authored
---------------------------------- Use the Infer/Check idea for typechecking higher-rank types ---------------------------------- The main idea is that data Expected ty = Infer (TcRef ty) | Check ty tcMonoExpr :: Expr -> Expected TcRhoType -> TcM Expra This "Expected" type tells tcMonoExpr whether it's doing inference or checking. It replaces the "HoleTv" flavour of type variable. This actually leads to slightly more lines of code, but it's much clearer, and the new type distinctions showed up several subtle bugs in the previous implementation. It all arose out of writing the prototype implementation for the paper. Error messages wibble around a little bit. I'm not quite certain why! But the changes look like improvements to me.
-
- 15 Apr, 2003 1 commit
-
-
simonmar authored
Fix bug in forkProcess: it should be using RET_N rather than returing directly. Makes a difference for unregisterised only. Remove dead code in atomicModifyMVarzh_fast.
-
- 14 Apr, 2003 2 commits