0.6.8.17:
[sbcl.git] / BUGS
1 REPORTING BUGS
2
3 Bugs can be reported on the help mailing list
4   sbcl-help@lists.sourceforge.net
5 or on the development mailing list
6   sbcl-devel@lists.sourceforge.net
7
8 Please include enough information in a bug report that someone reading
9 it can reproduce the problem, i.e. don't write
10      Subject: apparent bug in PRINT-OBJECT (or *PRINT-LENGTH*?)
11      PRINT-OBJECT doesn't seem to work with *PRINT-LENGTH*. Is this a bug?
12 but instead
13      Subject: apparent bug in PRINT-OBJECT (or *PRINT-LENGTH*?)
14      In sbcl-1.2.3 running under OpenBSD 4.5 on my Alpha box, when
15      I compile and load the file
16        (DEFSTRUCT (FOO (:PRINT-OBJECT (LAMBDA (X Y)
17                                         (LET ((*PRINT-LENGTH* 4))
18                                           (PRINT X Y)))))
19          X Y)
20      then at the command line type
21        (MAKE-FOO)
22      the program loops endlessly instead of printing the object.
23
24
25 NOTES:
26
27 There is also some information on bugs in the manual page and
28 in the TODO file. Eventually more such information may move here.
29
30 The gaps in the number sequence belong to old bugs which have been
31 fixed.
32
33
34 KNOWN BUGS OF NO SPECIAL CLASS:
35
36 2:
37   DEFSTRUCT should almost certainly overwrite the old LAYOUT information
38   instead of just punting when a contradictory structure definition
39   is loaded. As it is, if you redefine DEFSTRUCTs in a way which 
40   changes their layout, you probably have to rebuild your entire
41   program, even if you know or guess enough about the internals of
42   SBCL to wager that this (undefined in ANSI) operation would be safe.
43
44 3:
45   It should cause a STYLE-WARNING, not a full WARNING, when a structure
46   slot default value does not match the declared structure slot type.
47   (The current behavior is consistent with SBCL's behavior elsewhere,
48   and would not be a problem, except that the other behavior is 
49   specifically required by the ANSI spec.)
50
51 4:
52   It should cause a note, not a WARNING, when the system ignores
53   an FTYPE proclamation for a slot accessor.
54
55 5:
56   Error reporting on various stream-requiring operations is not 
57   very good when the stream argument has the wrong type, because
58   the operation tries to fall through to Gray stream code, and then
59   dies because it's undefined. E.g. 
60     (PRINT-UNREADABLE-OBJECT (*STANDARD-OUTPUT* 1)) ..)
61   gives the error message
62     error in SB-KERNEL::UNDEFINED-SYMBOL-ERROR-HANDLER:
63       The function SB-IMPL::STREAM-WRITE-STRING is undefined.
64   It would be more useful and correct to signal a TYPE-ERROR:
65     not a STREAM: 1
66   (It wouldn't be terribly difficult to write stubs for all the 
67   Gray stream functions that the old CMU CL code expects, with
68   each stub just raising the appropriate TYPE-ERROR.)
69
70 6:
71   bogus warnings about undefined functions for magic functions like
72   SB!C::%%DEFUN and SB!C::%DEFCONSTANT when cross-compiling files
73   like src/code/float.lisp
74
75 7:
76   The "byte compiling top-level form:" output ought to be condensed.
77   Perhaps any number of such consecutive lines ought to turn into a
78   single "byte compiling top-level forms:" line.
79
80 8:
81   Compiling a file containing the erroneous program
82         (DEFSTRUCT FOO
83           A
84           B)
85         (DEFSTRUCT (BAR (:INCLUDE FOO))
86           A
87           B)
88   gives only the not-very-useful message
89         caught ERROR:
90           (during macroexpansion)
91         Condition PROGRAM-ERROR was signalled.
92   (The specific message which says that the problem was duplicate
93   slot names gets lost.)
94
95 9:
96   The handling of IGNORE declarations on lambda list arguments of
97   DEFMETHOD is at least weird, and in fact seems broken and useless.
98   I should fix up another layer of binding, declared IGNORABLE, for
99   typed lambda list arguments.
100
101 10:
102   The way that the compiler munges types with arguments together
103   with types with no arguments (in e.g. TYPE-EXPAND) leads to
104   weirdness visible to the user:
105         (DEFTYPE FOO () 'FIXNUM)
106         (TYPEP 11 'FOO) => T
107         (TYPEP 11 '(FOO)) => T, which seems weird
108         (TYPEP 11 'FIXNUM) => T
109         (TYPEP 11 '(FIXNUM)) signals an error, as it should
110   The situation is complicated by the presence of Common Lisp types
111   like UNSIGNED-BYTE (which can either be used in list form or alone)
112   so I'm not 100% sure that the behavior above is actually illegal.
113   But I'm 90+% sure, and someday perhaps I'll be motivated to look it up..
114
115 11:
116   It would be nice if the
117         caught ERROR:
118           (during macroexpansion)
119   said what macroexpansion was at fault, e.g.
120         caught ERROR:
121           (during macroexpansion of IN-PACKAGE,
122           during macroexpansion of DEFFOO)
123
124 12:
125   The type system doesn't understand the KEYWORD type very well:
126         (SUBTYPEP 'KEYWORD 'SYMBOL) => NIL, NIL
127   It might be possible to fix this by changing the definition of
128   KEYWORD to (AND SYMBOL (SATISFIES KEYWORDP)), but the type system
129   would need to be a bit smarter about AND types, too:
130         (SUBTYPEP '(AND SYMBOL KEYWORD) 'SYMBOL) => NIL, NIL
131   (The type system does know something about AND types already,
132         (SUBTYPEP '(AND INTEGER FLOAT) 'NUMBER) => T, T
133         (SUBTYPEP '(AND INTEGER FIXNUM) 'NUMBER) =>T, T
134   so likely this is a small patch.)
135
136 13:
137   Floating point infinities are screwed up. [When I was converting CMU CL
138   to SBCL, I was looking for complexity to delete, and I thought it was safe
139   to just delete support for floating point infinities. It wasn't: they're
140   generated by the floating point hardware even when we remove support
141   for them in software. -- WHN] Support for them should be restored.
142
143 14:
144   The ANSI syntax for non-STANDARD method combination types in CLOS is
145         (DEFGENERIC FOO (X) (:METHOD-COMBINATION PROGN))
146         (DEFMETHOD FOO PROGN ((X BAR)) (PRINT 'NUMBER))
147   If you mess this up, omitting the PROGN qualifier in in DEFMETHOD,
148         (DEFGENERIC FOO (X) (:METHOD-COMBINATION PROGN))
149         (DEFMETHOD FOO ((X BAR)) (PRINT 'NUMBER))
150   the error mesage is not easy to understand:
151            INVALID-METHOD-ERROR was called outside the dynamic scope
152         of a method combination function (inside the body of
153         DEFINE-METHOD-COMBINATION or a method on the generic
154         function COMPUTE-EFFECTIVE-METHOD).
155   It would be better if it were more informative, a la
156            The method combination type for this method (STANDARD) does
157         not match the method combination type for the generic function
158         (PROGN).
159   Also, after you make the mistake of omitting the PROGN qualifier
160   on a DEFMETHOD, doing a new DEFMETHOD with the correct qualifier
161   no longer works:
162         (DEFMETHOD FOO PROGN ((X BAR)) (PRINT 'NUMBER))
163   gives
164            INVALID-METHOD-ERROR was called outside the dynamic scope
165         of a method combination function (inside the body of
166         DEFINE-METHOD-COMBINATION or a method on the generic
167         function COMPUTE-EFFECTIVE-METHOD).
168   This is not very helpful..
169
170 15:
171   (SUBTYPEP '(FUNCTION (T BOOLEAN) NIL)
172             '(FUNCTION (FIXNUM FIXNUM) NIL)) => T, T
173   (Also, when this is fixed, we can enable the code in PROCLAIM which 
174   checks for incompatible FTYPE redeclarations.)
175
176 16:
177   The ANSI spec says that CONS can be a compound type spec, e.g.
178   (CONS FIXNUM REAL). SBCL doesn't support this.
179
180 17:
181   from Paolo Amoroso on the CMU CL mailing list 27 Feb 2000:
182 I use CMU CL 18b under Linux. When COMPILE-FILE is supplied a physical
183 pathname, the type of the corresponding compiled file is X86F:
184         * (compile-file "/home/paolo/lisp/tools/foo")
185         Python version 1.0, VM version Intel x86 on 27 FEB 0 06:00:46 pm.
186         Compiling: /home/paolo/lisp/tools/foo.lisp 27 FEB 0 05:57:42 pm
187         Converted SQUARE.
188         Compiling DEFUN SQUARE:
189         Byte Compiling Top-Level Form:
190         /home/paolo/lisp/tools/foo.x86f written.
191         Compilation finished in 0:00:00.
192         #p"/home/paolo/lisp/tools/foo.x86f"
193         NIL
194         NIL
195 But when the function is called with a logical pathname, the file type
196 becomes FASL:
197         * (compile-file "tools:foo")
198         Python version 1.0, VM version Intel x86 on 27 FEB 0 06:01:04 pm.
199         Compiling: /home/paolo/lisp/tools/foo.lisp 27 FEB 0 05:57:42 pm
200         Converted SQUARE.
201         Compiling DEFUN SQUARE:
202         Byte Compiling Top-Level Form:
203         TOOLS:FOO.FASL written.
204         Compilation finished in 0:00:00.
205         #p"/home/paolo/lisp/tools/foo.fasl"
206         NIL
207         NIL
208
209 18:
210   from DTC on the CMU CL mailing list 25 Feb 2000:
211 ;;; Compiler fails when this file is compiled.
212 ;;;
213 ;;; Problem shows up in delete-block within ir1util.lisp. The assertion
214 ;;; (assert (member (functional-kind lambda) '(:let :mv-let :assignment)))
215 ;;; fails within bind node branch.
216 ;;;
217 ;;; Note that if c::*check-consistency* is enabled then an un-reached
218 ;;; entry is also reported.
219 ;;;
220 (defun foo (val)
221   (declare (values nil))
222   nil)
223 (defun bug (val)
224   (multiple-value-call
225       #'(lambda (res)
226           (block nil
227             (tagbody
228              loop
229                (when res
230                  (return nil))
231                (go loop))))
232     (foo val))
233   (catch 'ccc1
234     (throw 'ccc1
235       (block bbbb
236         (tagbody
237
238            (let ((ttt #'(lambda () (go cccc))))
239              (declare (special ttt))
240              (return-from bbbb nil))
241
242          cccc
243            (return-from bbbb nil))))))
244
245 19:
246   (I *think* this is a bug. It certainly seems like strange behavior. But
247   the ANSI spec is scary, dark, and deep..)
248     (FORMAT NIL  "~,1G" 1.4) => "1.    "
249     (FORMAT NIL "~3,1G" 1.4) => "1.    "
250
251 20:
252   from Marco Antoniotti on cmucl-imp mailing list 1 Mar 2000:
253         (defclass ccc () ())
254         (setf (find-class 'ccc1) (find-class 'ccc))
255         (defmethod zut ((c ccc1)) 123)
256   DTC's recommended workaround from the mailing list 3 Mar 2000:
257         (setf (pcl::find-class 'ccc1) (pcl::find-class 'ccc))
258
259 22:
260   The ANSI spec, in section "22.3.5.2 Tilde Less-Than-Sign: Logical Block",
261   says that an error is signalled if ~W, ~_, ~<...~:>, ~I, or ~:T is used
262   inside "~<..~>" (without the colon modifier on the closing syntax).
263   However, SBCL doesn't do this:
264         * (FORMAT T "~<munge~wegnum~>" 12)
265         munge12egnum
266         NIL
267
268 23:
269   When too many files are opened, OPEN will fail with an
270   uninformative error message 
271         error in function OPEN: error opening #P"/tmp/foo.lisp": NIL
272   instead of saying that too many files are open.
273
274 24:
275   Right now, when COMPILE-FILE has a read error, it actually pops
276   you into the debugger before giving up on the file. It should
277   instead handle the error, perhaps issuing (and handling)
278   a secondary error "caught ERROR: unrecoverable error during compilation"
279   and then return with FAILURE-P true,
280
281 25:
282   from CMU CL mailing list 01 May 2000 
283
284 I realize I can take care of this by doing (proclaim (ignore pcl::.slots1.))
285 but seeing as .slots0. is not-exported, shouldn't it be ignored within the
286 +expansion
287 when not used?
288  
289 In: DEFMETHOD FOO-BAR-BAZ (RESOURCE-TYPE)
290   (DEFMETHOD FOO-BAR-BAZ
291              ((SELF RESOURCE-TYPE))
292              (SETF (SLOT-VALUE SELF 'NAME) 3))
293 --> BLOCK MACROLET PCL::FAST-LEXICAL-METHOD-FUNCTIONS
294 --> PCL::BIND-FAST-LEXICAL-METHOD-MACROS MACROLET
295 --> PCL::BIND-LEXICAL-METHOD-FUNCTIONS LET PCL::BIND-ARGS LET* PCL::PV-BINDING
296 --> PCL::PV-BINDING1 PCL::PV-ENV LET
297 ==>
298   (LET ((PCL::.SLOTS0. #))
299     (PROGN SELF)
300     (BLOCK FOO-BAR-BAZ
301       (LET #
302         #)))
303 Warning: Variable PCL::.SLOTS0. defined but never used.
304  
305 Compilation unit finished.
306   1 warning
307
308 #<Standard-Method FOO-BAR-BAZ (RESOURCE-TYPE) {480918FD}>
309
310 26:
311   reported by Sam Steingold on the cmucl-imp mailing list 12 May 2000:
312
313 Also, there is another bug: `array-displacement' should return an array
314 or nil as first value (as per ANSI CL), while CMUCL declares it as
315 returning an array as first value always.
316
317 27:
318   Sometimes (SB-EXT:QUIT) fails with 
319         Argh! maximum interrupt nesting depth (4096) exceeded, exiting
320         Process inferior-lisp exited abnormally with code 1
321   I haven't noticed a repeatable case of this yet.
322
323 29:
324   some sort of bug in inlining and RETURN-FROM in sbcl-0.6.5: Compiling
325     (DEFUN BAR? (X)
326       (OR (NAR? X)
327           (BLOCK USED-BY-SOME-Y?
328             (FLET ((FROB (STK)
329                      (DOLIST (Y STK)
330                        (UNLESS (REJECTED? Y)
331                          (RETURN-FROM USED-BY-SOME-Y? T)))))
332               (DECLARE (INLINE FROB))
333               (FROB (RSTK X))
334               (FROB (MRSTK X)))
335             NIL)))
336   gives
337    error in function SB-KERNEL:ASSERT-ERROR:
338    The assertion (EQ (SB-C::CONTINUATION-KIND SB-C::CONT) :BLOCK-START) failed.
339   This is still present in sbcl-0.6.8.
340
341 30:
342   The CMU CL reader code takes liberties in binding the standard read table
343   when reading the names of characters. Tim Moore posted a patch to the 
344   CMU CL mailing list Mon, 22 May 2000 21:30:41 -0700.
345
346 31:
347   In some cases the compiler believes type declarations on array
348   elements without checking them, e.g.
349         (DECLAIM (OPTIMIZE (SAFETY 3) (SPEED 1) (SPACE 1)))
350         (DEFSTRUCT FOO A B)
351         (DEFUN BAR (X)
352           (DECLARE (TYPE (SIMPLE-ARRAY CONS 1) X))
353           (WHEN (CONSP (AREF X 0))
354             (PRINT (AREF X 0))))
355         (BAR (VECTOR (MAKE-FOO :A 11 :B 12)))
356   prints
357         #S(FOO :A 11 :B 12) 
358   in SBCL 0.6.5 (and also in CMU CL 18b). This does not happen for
359   all cases, e.g. the type assumption *is* checked if the array
360   elements are declared to be of some structure type instead of CONS.
361
362 32:
363   The printer doesn't report closures very well. This is true in 
364   CMU CL 18b as well:
365     (PRINT #'CLASS-NAME)
366   gives
367     #<Closure Over Function "DEFUN STRUCTURE-SLOT-ACCESSOR" {134D1A1}>
368   It would be nice to make closures have a settable name slot,
369   and make things like DEFSTRUCT and FLET, which create closures,
370   set helpful values into this slot.
371
372 33:
373   And as long as we're wishing, it would be awfully nice if INSPECT could
374   also report on closures, telling about the values of the bound variables.
375
376 34:
377   as reported by Robert Strandh on the CMU CL mailing list 12 Jun 2000:
378     $ cat xx.lisp
379     (defconstant +a-constant+ (make-instance 'a-class))
380     (defconstant +another-constant+ (vector +a-constant+))
381     $ lisp
382     CMU Common Lisp release x86-linux 2.4.19  8 February 2000 build 456,
383     running on
384     bobby
385     Send bug reports and questions to your local CMU CL maintainer,
386     or to pvaneynd@debian.org
387     or to cmucl-help@cons.org. (prefered)
388     type (help) for help, (quit) to exit, and (demo) to see the demos
389     Loaded subsystems:
390       Python 1.0, target Intel x86
391       CLOS based on PCL version:  September 16 92 PCL (f)
392     * (defclass a-class () ())
393     #<STANDARD-CLASS A-CLASS {48027BD5}>
394     * (compile-file "xx.lisp")
395     Python version 1.0, VM version Intel x86 on 12 JUN 00 08:12:55 am.
396     Compiling:
397     /home/strandh/Research/Functional/Common-Lisp/CLIM/Development/McCLIM
398     /xx.lisp 12 JUN 00 07:47:14 am
399     Compiling Load Time Value of (PCL::GET-MAKE-INSTANCE-FUNCTION-SYMBOL
400     '(A-CLASS NIL NIL)):
401     Byte Compiling Top-Level Form:
402     Error in function C::DUMP-STRUCTURE:  Attempt to dump invalid
403     structure:
404       #<A-CLASS {4803A5B5}>
405     How did this happen?
406
407 35:
408   The compiler assumes that any time a function of declared FTYPE
409   doesn't signal an error, its arguments were of the declared type.
410   E.g. compiling and loading
411     (DECLAIM (OPTIMIZE (SAFETY 3)))
412     (DEFUN FACTORIAL (X) (GAMMA (1+ X)))
413     (DECLAIM (FTYPE (FUNCTION (UNSIGNED-BYTE) FACTORIAL)))
414     (DEFUN FOO (X)
415       (COND ((> (FACTORIAL X) 1.0E6)
416              (FORMAT T "too big~%"))
417             ((INTEGERP X)
418              (FORMAT T "exactly ~S~%" (FACTORIAL X)))
419             (T
420              (FORMAT T "approximately ~S~%" (FACTORIAL X)))))
421   then executing
422     (FOO 1.5)
423   will cause the INTEGERP case to be selected, giving bogus output a la
424     exactly 1.33..
425   This violates the "declarations are assertions" principle.
426   According to the ANSI spec, in the section "System Class FUNCTION",
427   this is a case of "lying to the compiler", but the lying is done
428   by the code which calls FACTORIAL with non-UNSIGNED-BYTE arguments,
429   not by the unexpectedly general definition of FACTORIAL. In any case,
430   "declarations are assertions" means that lying to the compiler should
431   cause an error to be signalled, and should not cause a bogus
432   result to be returned. Thus, the compiler should not assume
433   that arbitrary functions check their argument types. (It might
434   make sense to add another flag (CHECKED?) to DEFKNOWN to 
435   identify functions which *do* check their argument types.)
436
437 36:
438   As pointed out by Martin Cracauer on the CMU CL mailing list
439   13 Jun 2000, the :FILE-LENGTH operation for 
440   FD-STREAM-MISC-ROUTINE is broken for large files: it says
441   (THE INDEX SIZE) even though SIZE can be larger than INDEX.
442
443 37:
444   In SBCL 0.6.5 (and CMU CL 18b) compiling and loading
445         (in-package :cl-user)
446         (declaim (optimize (safety 3)
447                            (debug 3)
448                            (compilation-speed 2)
449                            (space 1)
450                            (speed 2)
451                            #+nil (sb-ext:inhibit-warnings 2)))
452         (declaim (ftype (function * (values)) emptyvalues))
453         (defun emptyvalues (&rest rest) (declare (ignore rest)) (values))
454         (defstruct foo x y)
455         (defgeneric assertoid ((x t)))
456         (defmethod assertoid ((x t)) "just a placeholder")
457         (defun bar (ht)
458           (declare (type hash-table ht))
459           (let ((res
460                  (block blockname
461                    (progn
462                     (prog1
463                         (emptyvalues)
464                       (assertoid (hash-table-count ht)))))))
465             (unless (typep res 'foo)
466               (locally
467                (common-lisp-user::bad-result-from-assertive-typed-fun
468                 'bar
469                 res)))))
470   then executing
471         (bar (make-hash-table))
472   causes the failure
473         Error in KERNEL::UNDEFINED-SYMBOL-ERROR-HANDLER:
474           the function C::%INSTANCE-TYPEP is undefined.
475   %INSTANCE-TYPEP is always supposed to be IR1-transformed away, but for
476   some reason -- the (VALUES) return value declaration? -- the optimizer is
477   confused and compiles a full call to %INSTANCE-TYPEP (which doesn't exist
478   as a function) instead.
479
480 37a:
481   The %INSTANCE-TYPEP problem in bug 37 comes up also when compiling
482   and loading
483         (IN-PACKAGE :CL-USER)
484         (LOCALLY
485           (DECLARE (OPTIMIZE (SAFETY 3) (SPEED 2) (SPACE 2)))
486           (DECLAIM (FTYPE (FUNCTION (&REST T) (VALUES)) EMPTYVALUES))
487           (DEFUN EMPTYVALUES (&REST REST)
488             (DECLARE (IGNORE REST))
489             (VALUES))
490           (DEFSTRUCT DUMMYSTRUCT X Y)
491           (DEFUN FROB-EMPTYVALUES (X)
492             (LET ((RES (EMPTYVALUES X X X)))
493               (UNLESS (TYPEP RES 'DUMMYSTRUCT)
494                 'EXPECTED-RETURN-VALUE))))
495         (ASSERT (EQ (FROB-EMPTYVALUES 11) 'EXPECTED-RETURN-VALUE))
496
497
498 38:
499   DEFMETHOD doesn't check the syntax of &REST argument lists properly,
500   accepting &REST even when it's not followed by an argument name:
501         (DEFMETHOD FOO ((X T) &REST) NIL)
502
503 39:
504   On the CMU CL mailing list 26 June 2000, Douglas Crosher wrote
505
506   Hannu Rummukainen wrote:
507   ...
508   > There's something weird going on with the compilation of the attached
509   > code.  Compiling and loading the file in a fresh lisp, then invoking
510   > (test-it) gives
511   Thanks for the bug report, nice to have this one fixed. It was a bug
512   in the x86 backend, the < VOP. A fix has been committed to the main
513   source, see the file compiler/x86/float.lisp.
514
515   Probably the same bug exists in SBCL.
516
517 40:
518   TYPEP treats the result of UPGRADED-ARRAY-ELEMENT-TYPE as gospel,
519   so that (TYPEP (MAKE-ARRAY 3) '(VECTOR SOMETHING-NOT-DEFINED-YET))
520   returns (VALUES T T). Probably it should be an error instead,
521   complaining that the type SOMETHING-NOT-DEFINED-YET is not defined.
522
523 41:
524   TYPEP of VALUES types is sometimes implemented very inefficiently, e.g. in 
525         (DEFTYPE INDEXOID () '(INTEGER 0 1000))
526         (DEFUN FOO (X)
527           (DECLARE (TYPE INDEXOID X))
528           (THE (VALUES INDEXOID)
529             (VALUES X)))
530   where the implementation of the type check in function FOO 
531   includes a full call to %TYPEP. There are also some fundamental problems
532   with the interpretation of VALUES types (inherited from CMU CL, and
533   from the ANSI CL standard) as discussed on the cmucl-imp@cons.org
534   mailing list, e.g. in Robert Maclachlan's post of 21 Jun 2000.
535
536 42:
537   The definitions of SIGCONTEXT-FLOAT-REGISTER and
538   %SET-SIGCONTEXT-FLOAT-REGISTER in x86-vm.lisp say they're not
539   supported on FreeBSD because the floating point state is not saved,
540   but at least as of FreeBSD 4.0, the floating point state *is* saved,
541   so they could be supported after all. Very likely 
542   SIGCONTEXT-FLOATING-POINT-MODES could now be supported, too.
543
544 43:
545   (as discussed by Douglas Crosher on the cmucl-imp mailing list ca. 
546   Aug. 10, 2000): CMUCL currently interprets 'member as '(member); same
547   issue with 'union, 'and, 'or etc. So even though according to the
548   ANSI spec, bare 'MEMBER, 'AND, and 'OR are not legal types, CMUCL
549   (and now SBCL) interpret them as legal types.
550
551 44:
552   ANSI specifies DEFINE-SYMBOL-MACRO, but it's not defined in SBCL.
553   CMU CL added it ca. Aug 13, 2000, after some discussion on the mailing
554   list, and it is probably possible to use substantially the same 
555   patches to add it to SBCL.
556
557 45:
558   a slew of floating-point-related errors reported by Peter Van Eynde
559   on July 25, 2000:
560         a: (SQRT -9.0) fails, because SB-KERNEL::COMPLEX-SQRT is undefined.
561            Similarly, COMPLEX-ASIN, COMPLEX-ACOS, COMPLEX-ACOSH, and others
562            aren't found.
563         b: SBCL's value for LEAST-POSITIVE-SHORT-FLOAT is bogus, and 
564            should probably be 1.4012985e-45. In SBCL,
565            (/ LEAST-POSITIVE-SHORT-FLOAT 2) returns a number smaller
566            than LEAST-POSITIVE-SHORT-FLOAT. Similar problems 
567            exist for LEAST-NEGATIVE-SHORT-FLOAT, LEAST-POSITIVE-LONG-FLOAT,
568            and LEAST-NEGATIVE-LONG-FLOAT.
569         c: Many expressions generate floating infinity:
570                 (/ 1 0.0)
571                 (/ 1 0.0d0)
572                 (EXPT 10.0 1000)
573                 (EXPT 10.0d0 1000)
574            PVE's regression tests want them to raise errors. SBCL
575            generates the infinities instead, which may or may not be
576            conforming behavior, but then blow it by being unable to
577            output the infinities, since support for infinities is generally
578            broken, and in particular SB-IMPL::OUTPUT-FLOAT-INFINITY is
579            undefined.
580         d: (in section12.erg) various forms a la 
581                 (FLOAT 1 DOUBLE-FLOAT-EPSILON)
582            don't give the right behavior.
583
584 46:
585   type safety errors reported by Peter Van Eynde July 25, 2000:
586         a: (COERCE (QUOTE (A B C)) (QUOTE (VECTOR * 4)))
587            => #(A B C)
588            In general lengths of array type specifications aren't
589            checked by COERCE, so it fails when the spec is
590            (VECTOR 4), (STRING 2), (SIMPLE-BIT-VECTOR 3), or whatever.
591         b: CONCATENATE has the same problem of not checking the length
592            of specified output array types. MAKE-SEQUENCE and MAP and
593            MERGE also have the same problem.
594         c: (COERCE 'AND 'FUNCTION) returns something related to
595            (MACRO-FUNCTION 'AND), but ANSI says it should raise an error.
596         d: ELT signals SIMPLE-ERROR if its index argument
597            isn't a valid index for its sequence argument, but should 
598            signal TYPE-ERROR instead.
599         e: FILE-LENGTH is supposed to signal a type error when its
600            argument is not a stream associated with a file, but doesn't.
601         f: (FLOAT-RADIX 2/3) should signal an error instead of 
602            returning 2.
603         g: (LOAD "*.lsp") should signal FILE-ERROR.
604         h: (MAKE-CONCATENATED-STREAM (MAKE-STRING-OUTPUT-STREAM))
605            should signal TYPE-ERROR.
606         i: MAKE-TWO-WAY-STREAM doesn't check that its arguments can
607            be used for input and output as needed. It should fail with
608            TYPE-ERROR when handed e.g. the results of
609            MAKE-STRING-INPUT-STREAM or MAKE-STRING-OUTPUT-STREAM in
610            the inappropriate positions, but doesn't.
611         j: (PARSE-NAMESTRING (COERCE (LIST #\f #\o #\o (CODE-CHAR 0) #\4 #\8)
612                             (QUOTE STRING)))
613            should probably signal an error instead of making a pathname with
614            a null byte in it.
615         k: READ-BYTE is supposed to signal TYPE-ERROR when its argument is 
616            not a binary input stream, but instead cheerfully reads from
617            character streams, e.g. (MAKE-STRING-INPUT-STREAM "abc").
618
619 47:
620   DEFCLASS bugs reported by Peter Van Eynde July 25, 2000:
621         a: (DEFCLASS FOO () (A B A)) should signal a PROGRAM-ERROR, and
622            doesn't.
623         b: (DEFCLASS FOO () (A B A) (:DEFAULT-INITARGS X A X B)) should
624            signal a PROGRAM-ERROR, and doesn't.
625         c: (DEFCLASS FOO07 NIL ((A :ALLOCATION :CLASS :ALLOCATION :CLASS))),
626            and other DEFCLASS forms with duplicate specifications in their
627            slots, should signal a PROGRAM-ERROR, and doesn't.
628         d: (DEFGENERIC IF (X)) should signal a PROGRAM-ERROR, but instead
629            causes a COMPILER-ERROR.
630
631 48:
632   SYMBOL-MACROLET bugs reported by Peter Van Eynde July 25, 2000:
633         a: (SYMBOL-MACROLET ((T TRUE)) ..) should probably signal
634            PROGRAM-ERROR, but SBCL accepts it instead.
635         b: SYMBOL-MACROLET should refuse to bind something which is
636            declared as a global variable, signalling PROGRAM-ERROR.
637         c: SYMBOL-MACROLET should signal PROGRAM-ERROR if something
638            it binds is declared SPECIAL inside.
639
640 49:
641   LOOP bugs reported by Peter Van Eynde July 25, 2000:
642         a: (LOOP WITH (A B) DO (PRINT 1)) is a syntax error according to
643            the definition of WITH clauses given in the ANSI spec, but
644            compiles and runs happily in SBCL.
645         b: a messy one involving package iteration:
646 interpreted Form: (LET ((PACKAGE (MAKE-PACKAGE "LOOP-TEST"))) (INTERN "blah" PACKAGE) (LET ((BLAH2 (INTERN "blah2" PACKAGE))) (EXPORT BLAH2 PACKAGE)) (LIST (SORT (LOOP FOR SYM BEING EACH PRESENT-SYMBOL OF PACKAGE FOR SYM-NAME = (SYMBOL-NAME SYM) COLLECT SYM-NAME) (FUNCTION STRING<)) (SORT (LOOP FOR SYM BEING EACH EXTERNAL-SYMBOL OF PACKAGE FOR SYM-NAME = (SYMBOL-NAME SYM) COLLECT SYM-NAME) (FUNCTION STRING<))))
647 Should be: (("blah" "blah2") ("blah2"))
648 SBCL: (("blah") ("blah2"))
649         * (LET ((X 1)) (LOOP FOR I BY (INCF X) FROM X TO 10 COLLECT I))
650           doesn't work -- SBCL's LOOP says BY isn't allowed in a FOR clause.
651
652 50:
653   type system errors reported by Peter Van Eynde July 25, 2000:
654         a: (SUBTYPEP 'BIGNUM 'INTEGER) => NIL, NIL
655            but should be (VALUES T T) instead.
656         b: (SUBTYPEP 'EXTENDED-CHAR 'CHARACTER) => NIL, NIL
657            but should be (VALUES T T) instead.
658         c: (SUBTYPEP '(INTEGER (0) (0)) 'NIL) dies with nested errors.
659         d: In general, the system doesn't like '(INTEGER (0) (0)) -- it
660            blows up at the level of SPECIFIER-TYPE with
661            "Lower bound (0) is greater than upper bound (0)." Probably
662            SPECIFIER-TYPE should return NIL instead.
663         e: (TYPEP 0 '(COMPLEX (EQL 0)) fails with
664            "Component type for Complex is not numeric: (EQL 0)."
665            This might be easy to fix; the type system already knows
666            that (SUBTYPEP '(EQL 0) 'NUMBER) is true.
667         f: The type system doesn't know about the condition system,
668            so that e.g. (TYPEP 'SIMPLE-ERROR 'ERROR)=>NIL.
669         g: The type system isn't all that smart about relationships
670            between hairy types, as shown in the type.erg test results,
671            e.g. (SUBTYPEP 'CONS '(NOT ATOM)) => NIL, NIL.
672
673 51:
674   miscellaneous errors reported by Peter Van Eynde July 25, 2000:
675         a: (PROGN
676             (DEFGENERIC FOO02 (X))
677             (DEFMETHOD FOO02 ((X NUMBER)) T)
678             (LET ((M (FIND-METHOD (FUNCTION FOO02)
679                                   NIL
680                                   (LIST (FIND-CLASS (QUOTE NUMBER))))))
681               (REMOVE-METHOD (FUNCTION FOO02) M)
682               (DEFGENERIC FOO03 (X))
683               (ADD-METHOD (FUNCTION FOO03) M)))
684            should give an error, but SBCL allows it.
685         b: READ should probably return READER-ERROR, not the bare 
686            arithmetic error, when input a la "1/0" or "1e1000" causes
687            an arithmetic error.
688
689 52:
690   It has been reported (e.g. by Peter Van Eynde) that there are 
691   several metaobject protocol "errors". (In order to fix them, we might
692   need to document exactly what metaobject protocol specification
693   we're following -- the current code is just inherited from PCL.)
694
695 53:
696   another error from Peter Van Eynde 5 September 2000:
697   (FORMAT NIL "~F" "FOO") should work, but instead reports an error.
698   PVE submitted a patch to deal with this bug, but it exposes other
699   comparably serious bugs, so I didn't apply it. It looks as though
700   the FORMAT code needs a fair amount of rewriting in order to comply
701   with the various details of the ANSI spec.
702
703 54:
704   The implementation of #'+ returns its single argument without
705   type checking, e.g. (+ "illegal") => "illegal".
706
707 55:
708   In sbcl-0.6.7, there is no doc string for CL:PUSH, probably 
709   because it's defined with the DEFMACRO-MUNDANELY macro and something
710   is wrong with doc string setting in that macro.
711
712 56:
713   Attempting to use COMPILE on something defined by DEFMACRO fails:
714         (DEFMACRO FOO (X) (CONS X X))
715         (COMPILE 'FOO)
716 Error in function C::GET-LAMBDA-TO-COMPILE:
717    #<Closure Over Function "DEFUN (SETF MACRO-FUNCTION)" {480E21B1}> was defined in a non-null environment.
718
719 58:
720   (SUBTYPEP '(AND ZILCH INTEGER) 'ZILCH)
721   => NIL, NIL
722
723 59:
724   CL:*DEFAULT-PATHNAME-DEFAULTS* doesn't behave as ANSI suggests (reflecting
725   current working directory). And there's no supported way to update
726   or query the current working directory (a la Unix "chdir" and "pwd"),
727   which is functionality that ILISP needs (and currently gets with low-level
728   hacks).
729
730 60:
731   The debugger LIST-LOCATIONS command doesn't work properly.
732
733 61:
734   Compiling and loading
735     (DEFUN FAIL (X) (THROW 'FAIL-TAG X))
736     (FAIL 12)
737   then requesting a BACKTRACE at the debugger prompt gives no information
738   about where in the user program the problem occurred.
739
740 62:
741   The compiler is supposed to do type inference well enough that 
742   the declaration in
743     (TYPECASE X
744       ((SIMPLE-ARRAY SINGLE-FLOAT)
745        (LOCALLY
746          (DECLARE (TYPE (SIMPLE-ARRAY SINGLE-FLOAT) X))
747          ..))
748       ..)
749   is redundant. However, as reported by Juan Jose Garcia Ripoll for
750   CMU CL, it sometimes doesn't. Adding declarations is a pretty good
751   workaround for the problem for now, but can't be done by the TYPECASE
752   macros themselves, since it's too hard for the macro to detect
753   assignments to the variable within the clause. 
754     Note: The compiler *is* smart enough to do the type inference in
755   many cases. This case, derived from a couple of MACROEXPAND-1
756   calls on Ripoll's original test case,
757     (DEFUN NEGMAT (A)
758       (DECLARE (OPTIMIZE SPEED (SAFETY 0)))
759       (COND ((TYPEP A '(SIMPLE-ARRAY SINGLE-FLOAT)) NIL
760              (LET ((LENGTH (ARRAY-TOTAL-SIZE A)))
761                (LET ((I 0) (G2554 LENGTH))
762                  (DECLARE (TYPE REAL G2554) (TYPE REAL I))
763                  (TAGBODY
764                   SB-LOOP::NEXT-LOOP
765                   (WHEN (>= I G2554) (GO SB-LOOP::END-LOOP))
766                   (SETF (ROW-MAJOR-AREF A I) (- (ROW-MAJOR-AREF A I)))
767                   (GO SB-LOOP::NEXT-LOOP)
768                   SB-LOOP::END-LOOP))))))
769   demonstrates the problem; but the problem goes away if the TAGBODY
770   and GO forms are removed (leaving the SETF in ordinary, non-looping
771   code), or if the TAGBODY and GO forms are retained, but the 
772   assigned value becomes 0.0 instead of (- (ROW-MAJOR-AREF A I)).
773
774
775 KNOWN BUGS RELATED TO THE IR1 INTERPRETER
776
777 (Note: At some point, the pure interpreter (actually a semi-pure
778 interpreter aka "the IR1 interpreter") will probably go away, replaced
779 by constructs like
780   (DEFUN EVAL (X) (FUNCALL (COMPILE NIL (LAMBDA ..)))))
781 and at that time these bugs should either go away automatically or
782 become more tractable to fix. Until then, they'll probably remain,
783 since some of them aren't considered urgent, and the rest are too hard
784 to fix as long as so many special cases remain. After the IR1
785 interpreter goes away is also the preferred time to start
786 systematically exterminating cases where debugging functionality
787 (backtrace, breakpoint, etc.) breaks down, since getting rid of the
788 IR1 interpreter will reduce the number of special cases we need to
789 support.)
790
791 IR1-1:
792   The FUNCTION special operator doesn't check properly whether its
793   argument is a function name. E.g. (FUNCTION (X Y)) returns a value
794   instead of failing with an error. (Later attempting to funcall the
795   value does cause an error.) 
796
797 IR1-2:
798   COMPILED-FUNCTION-P bogusly reports T for interpreted functions:
799         * (DEFUN FOO (X) (- 12 X))
800         FOO
801         * (COMPILED-FUNCTION-P #'FOO)
802         T
803
804 IR1-3:
805   Executing 
806     (DEFVAR *SUPPRESS-P* T)
807     (EVAL '(UNLESS *SUPPRESS-P*
808              (EVAL-WHEN (:COMPILE-TOPLEVEL :LOAD-TOPLEVEL :EXECUTE)
809                (FORMAT T "surprise!"))))
810   prints "surprise!". Probably the entire EVAL-WHEN mechanism ought to be
811   rewritten from scratch to conform to the ANSI definition, abandoning
812   the *ALREADY-EVALED-THIS* hack which is used in sbcl-0.6.8.9 (and
813   in the original CMU CL source, too). This should be easier to do --
814   though still nontrivial -- once the various IR1 interpreter special
815   cases are gone.
816
817 IR1-3a:
818   EVAL-WHEN's idea of what's a toplevel form is even more screwed up 
819   than the example in IR1-3 would suggest, since COMPILE-FILE and
820   COMPILE both print both "right now!" messages when compiling the
821   following code,
822     (LAMBDA (X)
823       (COND (X
824              (EVAL-WHEN (:COMPILE-TOPLEVEL :LOAD-TOPLEVEL :EXECUTE)
825                (PRINT "yes! right now!"))
826              "yes!")
827             (T
828              (EVAL-WHEN (:COMPILE-TOPLEVEL :LOAD-TOPLEVEL :EXECUTE)
829                (PRINT "no! right now!"))
830              "no!")))
831   and while EVAL doesn't print the "right now!" messages, the first
832   FUNCALL on the value returned by EVAL causes both of them to be printed.
833
834 IR1-4:
835   The system accepts DECLAIM in most places where DECLARE would be 
836   accepted, without even issuing a warning. ANSI allows this, but since
837   it's fairly easy to mistype DECLAIM instead of DECLARE, and the
838   meaning is rather different, and it's unlikely that the user
839   has a good reason for doing DECLAIM not at top level, it would be 
840   good to issue a STYLE-WARNING when this happens. A possible
841   fix would be to issue STYLE-WARNINGs for DECLAIMs not at top level,
842   or perhaps to issue STYLE-WARNINGs for any EVAL-WHEN not at top level.
843   [This is considered an IR1-interpreter-related bug because until
844   EVAL-WHEN is rewritten, which won't happen until after the IR1
845   interpreter is gone, the system's notion of what's a top-level form
846   and what's not will remain too confused to fix this problem.]