0.7.3.18:
[sbcl.git] / src / code / class.lisp
1 ;;;; This file contains structures and functions for the maintenance of
2 ;;;; basic information about defined types. Different object systems
3 ;;;; can be supported simultaneously. Some of the functions here are
4 ;;;; nominally generic, and are overwritten when CLOS is loaded.
5
6 ;;;; This software is part of the SBCL system. See the README file for
7 ;;;; more information.
8 ;;;;
9 ;;;; This software is derived from the CMU CL system, which was
10 ;;;; written at Carnegie Mellon University and released into the
11 ;;;; public domain. The software is in the public domain and is
12 ;;;; provided with absolutely no warranty. See the COPYING and CREDITS
13 ;;;; files for more information.
14
15 (in-package "SB!KERNEL")
16
17 (!begin-collecting-cold-init-forms)
18 \f
19 ;;;; the CLASS structure
20
21 ;;; The CLASS structure is a supertype of all class types. A CLASS is
22 ;;; also a CTYPE structure as recognized by the type system.
23 (def!struct (;; FIXME: Yes, these #+SB-XC/#-SB-XC conditionals are
24              ;; pretty hairy. I'm considering cleaner ways to rewrite
25              ;; the whole build system to avoid these (and other hacks
26              ;; too, e.g. UNCROSS) but I'm not sure yet that I've got
27              ;; it figured out. -- WHN 19990729
28              #-sb-xc sb!xc:class
29              #+sb-xc cl:class
30              (:make-load-form-fun class-make-load-form-fun)
31              (:include ctype
32                        (class-info (type-class-or-lose #-sb-xc 'sb!xc:class
33                                                         #+sb-xc 'cl:class)))
34              (:constructor nil)
35              #-no-ansi-print-object
36              (:print-object
37               (lambda (class stream)
38                 (let ((name (sb!xc:class-name class)))
39                   (print-unreadable-object (class stream
40                                                   :type t
41                                                   :identity (not name))
42                     (format stream
43                             ;; FIXME: Make sure that this prints
44                             ;; reasonably for anonymous classes.
45                             "~:[anonymous~;~:*~S~]~@[ (~(~A~))~]"
46                             name
47                             (class-state class))))))
48              #-sb-xc-host (:pure nil))
49   ;; the value to be returned by CLASS-NAME. (CMU CL used the raw slot
50   ;; accessor for this slot directly as the definition of
51   ;; CL:CLASS-NAME, but that was slightly wrong, because ANSI says
52   ;; that CL:CLASS-NAME is a generic function.)
53   (%name nil :type symbol)
54   ;; the current layout for this class, or NIL if none assigned yet
55   (layout nil :type (or layout null))
56   ;; How sure are we that this class won't be redefined?
57   ;;   :READ-ONLY = We are committed to not changing the effective 
58   ;;                slots or superclasses.
59   ;;   :SEALED    = We can't even add subclasses.
60   ;;   NIL        = Anything could happen.
61   (state nil :type (member nil :read-only :sealed))
62   ;; direct superclasses of this class
63   (direct-superclasses () :type list)
64   ;; representation of all of the subclasses (direct or indirect) of
65   ;; this class. This is NIL if no subclasses or not initalized yet;
66   ;; otherwise, it's an EQ hash-table mapping CL:CLASS objects to the
67   ;; subclass layout that was in effect at the time the subclass was
68   ;; created.
69   (subclasses nil :type (or null hash-table))
70   ;; the PCL class object for this class, or NIL if none assigned yet
71   (pcl-class nil))
72
73 ;;; KLUDGE: ANSI says this is a generic function, but we need it for
74 ;;; bootstrapping before CLOS exists, so we define it as an ordinary
75 ;;; function and let CLOS code overwrite it later. -- WHN ca. 19990815
76 (defun sb!xc:class-name (class)
77   (class-%name class))
78
79 (defun class-make-load-form-fun (class)
80   (/show "entering CLASS-MAKE-LOAD-FORM-FUN" class)
81   (let ((name (sb!xc:class-name class)))
82     (unless (and name (eq (sb!xc:find-class name nil) class))
83       (/show "anonymous/undefined class case")
84       (error "can't use anonymous or undefined class as constant:~%  ~S"
85              class))
86     `(locally
87        ;; KLUDGE: There's a FIND-CLASS DEFTRANSFORM for constant class
88        ;; names which creates fast but non-cold-loadable, non-compact
89        ;; code. In this context, we'd rather have compact,
90        ;; cold-loadable code. -- WHN 19990928
91        (declare (notinline sb!xc:find-class))
92        (sb!xc:find-class ',name))))
93 \f
94 ;;;; basic LAYOUT stuff
95
96 ;;; Note: This bound is set somewhat less than MOST-POSITIVE-FIXNUM
97 ;;; in order to guarantee that several hash values can be added without
98 ;;; overflowing into a bignum.
99 (def!constant layout-clos-hash-max (ash most-positive-fixnum -3)
100   #!+sb-doc
101   "the inclusive upper bound on LAYOUT-CLOS-HASH values")
102
103 ;;; a list of conses, initialized by genesis
104 ;;;
105 ;;; In each cons, the car is the symbol naming the layout, and the
106 ;;; cdr is the layout itself.
107 (defvar *!initial-layouts*)
108
109 ;;; a table mapping class names to layouts for classes we have
110 ;;; referenced but not yet loaded. This is initialized from an alist
111 ;;; created by genesis describing the layouts that genesis created at
112 ;;; cold-load time.
113 (defvar *forward-referenced-layouts*)
114 (!cold-init-forms
115   (setq *forward-referenced-layouts* (make-hash-table :test 'equal))
116   #-sb-xc-host (progn
117                  (/show0 "processing *!INITIAL-LAYOUTS*")
118                  (dolist (x *!initial-layouts*)
119                    (setf (gethash (car x) *forward-referenced-layouts*)
120                          (cdr x)))
121                  (/show0 "done processing *!INITIAL-LAYOUTS*")))
122
123 ;;; The LAYOUT structure is pointed to by the first cell of instance
124 ;;; (or structure) objects. It represents what we need to know for
125 ;;; type checking and garbage collection. Whenever a class is
126 ;;; incompatibly redefined, a new layout is allocated. If two object's
127 ;;; layouts are EQ, then they are exactly the same type.
128 ;;;
129 ;;; KLUDGE: The genesis code has raw offsets of slots in this
130 ;;; structure hardwired into it. It would be good to rewrite that code
131 ;;; so that it looks up those offsets in the compiler's tables, but
132 ;;; for now if you change this structure, lucky you, you get to grovel
133 ;;; over the genesis code by hand.:-( -- WHN 19990820
134 (def!struct (layout
135              ;; KLUDGE: A special hack keeps this from being
136              ;; called when building code for the
137              ;; cross-compiler. See comments at the DEFUN for
138              ;; this. -- WHN 19990914
139              (:make-load-form-fun #-sb-xc-host ignore-it
140                                   ;; KLUDGE: DEF!STRUCT at #+SB-XC-HOST
141                                   ;; time controls both the
142                                   ;; build-the-cross-compiler behavior
143                                   ;; and the run-the-cross-compiler
144                                   ;; behavior. The value below only
145                                   ;; works for build-the-cross-compiler.
146                                   ;; There's a special hack in
147                                   ;; EMIT-MAKE-LOAD-FORM which gives
148                                   ;; effectively IGNORE-IT behavior for
149                                   ;; LAYOUT at run-the-cross-compiler
150                                   ;; time. It would be cleaner to
151                                   ;; actually have an IGNORE-IT value
152                                   ;; stored, but it's hard to see how to
153                                   ;; do that concisely with the current
154                                   ;; DEF!STRUCT setup. -- WHN 19990930
155                                   #+sb-xc-host
156                                   make-load-form-for-layout))
157   ;; hash bits which should be set to constant pseudo-random values
158   ;; for use by CLOS. Sleazily accessed via %INSTANCE-REF, see
159   ;; LAYOUT-CLOS-HASH.
160   ;;
161   ;; FIXME: We should get our story straight on what the type of these
162   ;; values is. (declared INDEX here, described as <=
163   ;; LAYOUT-CLOS-HASH-MAX by the doc string of that constant,
164   ;; generated as strictly positive in RANDOM-LAYOUT-CLOS-HASH..)
165   ;;
166   ;; KLUDGE: The fact that the slots here start at offset 1 is known
167   ;; to the LAYOUT-CLOS-HASH function and to the LAYOUT-dumping code
168   ;; in GENESIS.
169   (clos-hash-0 (random-layout-clos-hash) :type index)
170   (clos-hash-1 (random-layout-clos-hash) :type index)
171   (clos-hash-2 (random-layout-clos-hash) :type index)
172   (clos-hash-3 (random-layout-clos-hash) :type index)
173   (clos-hash-4 (random-layout-clos-hash) :type index)
174   (clos-hash-5 (random-layout-clos-hash) :type index)
175   (clos-hash-6 (random-layout-clos-hash) :type index)
176   (clos-hash-7 (random-layout-clos-hash) :type index)
177   ;; the class that this is a layout for
178   (class (missing-arg)
179          ;; FIXME: Do we really know this is a CL:CLASS? Mightn't it
180          ;; be a SB-PCL:CLASS under some circumstances? What goes here
181          ;; when the LAYOUT is in fact a PCL::WRAPPER?
182          :type #-sb-xc sb!xc:class #+sb-xc cl:class)
183   ;; The value of this slot can be:
184   ;;   * :UNINITIALIZED if not initialized yet;
185   ;;   * NIL if this is the up-to-date layout for a class; or
186   ;;   * T if this layout has been invalidated (by being replaced by 
187   ;;     a new, more-up-to-date LAYOUT).
188   ;;   * something else (probably a list) if the class is a PCL wrapper
189   ;;     and PCL has made it invalid and made a note to itself about it
190   (invalid :uninitialized :type (or cons (member nil t :uninitialized)))
191   ;; the layouts for all classes we inherit. If hierarchical, i.e. if
192   ;; DEPTHOID >= 0, then these are ordered by ORDER-LAYOUT-INHERITS,
193   ;; so that each inherited layout appears at its expected depth,
194   ;; i.e. at its LAYOUT-DEPTHOID value.
195   ;;
196   ;; Remaining elements are filled by the non-hierarchical layouts or,
197   ;; if they would otherwise be empty, by copies of succeeding layouts.
198   (inherits #() :type simple-vector)
199   ;; If inheritance is not hierarchical, this is -1. If inheritance is 
200   ;; hierarchical, this is the inheritance depth, i.e. (LENGTH INHERITS).
201   ;; Note:
202   ;;  (1) This turns out to be a handy encoding for arithmetically
203   ;;      comparing deepness; it is generally useful to do a bare numeric
204   ;;      comparison of these depthoid values, and we hardly ever need to
205   ;;      test whether the values are negative or not.
206   ;;  (2) This was called INHERITANCE-DEPTH in classic CMU CL. It was
207   ;;      renamed because some of us find it confusing to call something
208   ;;      a depth when it isn't quite.
209   (depthoid -1 :type layout-depthoid)
210   ;; the number of top level descriptor cells in each instance
211   (length 0 :type index)
212   ;; If this layout has some kind of compiler meta-info, then this is
213   ;; it. If a structure, then we store the DEFSTRUCT-DESCRIPTION here.
214   (info nil)
215   ;; This is true if objects of this class are never modified to
216   ;; contain dynamic pointers in their slots or constant-like
217   ;; substructure (and hence can be copied into read-only space by
218   ;; PURIFY).
219   ;;
220   ;; KLUDGE: This slot is known to the C runtime support code.
221   (pure nil :type (member t nil 0)))
222
223 (def!method print-object ((layout layout) stream)
224   (print-unreadable-object (layout stream :type t :identity t)
225     (format stream
226             "for ~S~@[, INVALID=~S~]"
227             (layout-proper-name layout)
228             (layout-invalid layout))))
229
230 (eval-when (:compile-toplevel :load-toplevel :execute)
231   (defun layout-proper-name (layout)
232     (class-proper-name (layout-class layout))))
233 \f
234 ;;;; support for the hash values used by CLOS when working with LAYOUTs
235
236 (def!constant layout-clos-hash-length 8)
237 #!-sb-fluid (declaim (inline layout-clos-hash))
238 (defun layout-clos-hash (layout i)
239   ;; FIXME: Either this I should be declared to be `(MOD
240   ;; ,LAYOUT-CLOS-HASH-LENGTH), or this is used in some inner loop
241   ;; where we can't afford to check that kind of thing and therefore
242   ;; should have some insane level of optimization. (This is true both
243   ;; of this function and of the SETF function below.)
244   (declare (type layout layout) (type index i))
245   ;; FIXME: LAYOUT slots should have type `(MOD ,LAYOUT-CLOS-HASH-MAX),
246   ;; not INDEX.
247   (truly-the index (%instance-ref layout (1+ i))))
248 #!-sb-fluid (declaim (inline (setf layout-clos-hash)))
249 (defun (setf layout-clos-hash) (new-value layout i)
250   (declare (type layout layout) (type index new-value i))
251   (setf (%instance-ref layout (1+ i)) new-value))
252
253 ;;; a generator for random values suitable for the CLOS-HASH slots of
254 ;;; LAYOUTs. We use our own RANDOM-STATE here because we'd like
255 ;;; pseudo-random values to come the same way in the target even when
256 ;;; we make minor changes to the system, in order to reduce the
257 ;;; mysteriousness of possible CLOS bugs.
258 (defvar *layout-clos-hash-random-state*)
259 (defun random-layout-clos-hash ()
260   ;; FIXME: I'm not sure why this expression is (1+ (RANDOM FOO)),
261   ;; returning a strictly positive value. I copied it verbatim from
262   ;; CMU CL INITIALIZE-LAYOUT-HASH, so presumably it works, but I
263   ;; dunno whether the hash values are really supposed to be 1-based.
264   ;; They're declared as INDEX.. Or is this a hack to try to avoid
265   ;; having to use bignum arithmetic? Or what? An explanation would be
266   ;; nice.
267   (1+ (random layout-clos-hash-max
268               (if (boundp '*layout-clos-hash-random-state*)
269                   *layout-clos-hash-random-state*
270                   (setf *layout-clos-hash-random-state*
271                         (make-random-state))))))
272 \f
273 ;;; If we can't find any existing layout, then we create a new one
274 ;;; storing it in *FORWARD-REFERENCED-LAYOUTS*. In classic CMU CL, we
275 ;;; used to immediately check for compatibility, but for
276 ;;; cross-compilability reasons (i.e. convenience of using this
277 ;;; function in a MAKE-LOAD-FORM expression) that functionality has
278 ;;; been split off into INIT-OR-CHECK-LAYOUT.
279 (declaim (ftype (function (symbol) layout) find-layout))
280 (defun find-layout (name)
281   (let ((class (sb!xc:find-class name nil)))
282     (or (and class (class-layout class))
283         (gethash name *forward-referenced-layouts*)
284         (setf (gethash name *forward-referenced-layouts*)
285               (make-layout :class (or class (make-undefined-class name)))))))
286
287 ;;; If LAYOUT is uninitialized, initialize it with CLASS, LENGTH,
288 ;;; INHERITS, and DEPTHOID, otherwise require that it be consistent
289 ;;; with CLASS, LENGTH, INHERITS, and DEPTHOID.
290 ;;;
291 ;;; UNDEFINED-CLASS values are interpreted specially as "we don't know
292 ;;; anything about the class", so if LAYOUT is initialized, any
293 ;;; preexisting class slot value is OK, and if it's not initialized,
294 ;;; its class slot value is set to an UNDEFINED-CLASS. -- FIXME: This
295 ;;; is no longer true, :UNINITIALIZED used instead.
296 (declaim (ftype (function (layout sb!xc:class index simple-vector layout-depthoid) layout)
297                 init-or-check-layout))
298 (defun init-or-check-layout (layout class length inherits depthoid)
299   (cond ((eq (layout-invalid layout) :uninitialized)
300          ;; There was no layout before, we just created one which
301          ;; we'll now initialize with our information.
302          (setf (layout-length layout) length
303                (layout-inherits layout) inherits
304                (layout-depthoid layout) depthoid
305                (layout-class layout) class
306                (layout-invalid layout) nil))
307         ;; FIXME: Now that LAYOUTs are born :UNINITIALIZED, maybe this
308         ;; clause is not needed?
309         ((not *type-system-initialized*)
310          (setf (layout-class layout) class))
311         (t
312          ;; There was an old layout already initialized with old
313          ;; information, and we'll now check that old information
314          ;; which was known with certainty is consistent with current
315          ;; information which is known with certainty.
316          (check-layout layout class length inherits depthoid)))
317   layout)
318
319 ;;; In code for the target Lisp, we don't use dump LAYOUTs using the
320 ;;; standard load form mechanism, we use special fops instead, in
321 ;;; order to make cold load come out right. But when we're building
322 ;;; the cross-compiler, we can't do that because we don't have access
323 ;;; to special non-ANSI low-level things like special fops, and we
324 ;;; don't need to do that anyway because our code isn't going to be
325 ;;; cold loaded, so we use the ordinary load form system.
326 ;;;
327 ;;; KLUDGE: A special hack causes this not to be called when we are
328 ;;; building code for the target Lisp. It would be tidier to just not
329 ;;; have it in place when we're building the target Lisp, but it
330 ;;; wasn't clear how to do that without rethinking DEF!STRUCT quite a
331 ;;; bit, so I punted. -- WHN 19990914
332 #+sb-xc-host
333 (defun make-load-form-for-layout (layout &optional env)
334   (declare (type layout layout))
335   (declare (ignore env))
336   (when (layout-invalid layout)
337     (compiler-error "can't dump reference to obsolete class: ~S"
338                     (layout-class layout)))
339   (let ((name (sb!xc:class-name (layout-class layout))))
340     (unless name
341       (compiler-error "can't dump anonymous LAYOUT: ~S" layout))
342     ;; Since LAYOUT refers to a class which refers back to the LAYOUT,
343     ;; we have to do this in two stages, like the TREE-WITH-PARENT
344     ;; example in the MAKE-LOAD-FORM entry in the ANSI spec.
345     (values
346      ;; "creation" form (which actually doesn't create a new LAYOUT if
347      ;; there's a preexisting one with this name)
348      `(find-layout ',name)
349      ;; "initialization" form (which actually doesn't initialize
350      ;; preexisting LAYOUTs, just checks that they're consistent).
351      `(init-or-check-layout ',layout
352                             ',(layout-class layout)
353                             ',(layout-length layout)
354                             ',(layout-inherits layout)
355                             ',(layout-depthoid layout)))))
356
357 ;;; If LAYOUT's slot values differ from the specified slot values in
358 ;;; any interesting way, then give a warning and return T.
359 (declaim (ftype (function (simple-string
360                            layout
361                            simple-string
362                            index
363                            simple-vector
364                            layout-depthoid))
365                 redefine-layout-warning))
366 (defun redefine-layout-warning (old-context old-layout
367                                 context length inherits depthoid)
368   (declare (type layout old-layout) (type simple-string old-context context))
369   (let ((name (layout-proper-name old-layout)))
370     (or (let ((old-inherits (layout-inherits old-layout)))
371           (or (when (mismatch old-inherits
372                               inherits
373                               :key #'layout-proper-name)
374                 (warn "change in superclasses of class ~S:~%  ~
375                        ~A superclasses: ~S~%  ~
376                        ~A superclasses: ~S"
377                       name
378                       old-context
379                       (map 'list #'layout-proper-name old-inherits)
380                       context
381                       (map 'list #'layout-proper-name inherits))
382                 t)
383               (let ((diff (mismatch old-inherits inherits)))
384                 (when diff
385                   (warn
386                    "in class ~S:~%  ~
387                     ~:(~A~) definition of superclass ~S is incompatible with~%  ~
388                     ~A definition."
389                    name
390                    old-context
391                    (layout-proper-name (svref old-inherits diff))
392                    context)
393                   t))))
394         (let ((old-length (layout-length old-layout)))
395           (unless (= old-length length)
396             (warn "change in instance length of class ~S:~%  ~
397                    ~A length: ~W~%  ~
398                    ~A length: ~W"
399                   name
400                   old-context old-length
401                   context length)
402             t))
403         (unless (= (layout-depthoid old-layout) depthoid)
404           (warn "change in the inheritance structure of class ~S~%  ~
405                  between the ~A definition and the ~A definition"
406                 name old-context context)
407           t))))
408
409 ;;; Require that LAYOUT data be consistent with CLASS, LENGTH,
410 ;;; INHERITS, and DEPTHOID.
411 (declaim (ftype (function (layout sb!xc:class index simple-vector layout-depthoid))
412                 check-layout))
413 (defun check-layout (layout class length inherits depthoid)
414   (aver (eq (layout-class layout) class))
415   (when (redefine-layout-warning "current" layout
416                                  "compile time" length inherits depthoid)
417     ;; Classic CMU CL had more options here. There are several reasons
418     ;; why they might want more options which are less appropriate for
419     ;; us: (1) It's hard to fit the classic CMU CL flexible approach
420     ;; into the ANSI-style MAKE-LOAD-FORM system, and having a
421     ;; non-MAKE-LOAD-FORM-style system is painful when we're trying to
422     ;; make the cross-compiler run under vanilla ANSI Common Lisp. (2)
423     ;; We have CLOS now, and if you want to be able to flexibly
424     ;; redefine classes without restarting the system, it'd make sense
425     ;; to use that, so supporting complexity in order to allow
426     ;; modifying DEFSTRUCTs without restarting the system is a low
427     ;; priority. (3) We now have the ability to rebuild the SBCL
428     ;; system from scratch, so we no longer need this functionality in
429     ;; order to maintain the SBCL system by modifying running images.
430     (error "The class ~S was not changed, and there's no guarantee that~@
431             the loaded code (which expected another layout) will work."
432            (layout-proper-name layout)))
433   (values))
434
435 ;;; a common idiom (the same as CMU CL FIND-LAYOUT) rolled up into a
436 ;;; single function call
437 ;;;
438 ;;; Used by the loader to forward-reference layouts for classes whose
439 ;;; definitions may not have been loaded yet. This allows type tests
440 ;;; to be loaded when the type definition hasn't been loaded yet.
441 (declaim (ftype (function (symbol index simple-vector layout-depthoid) layout)
442                 find-and-init-or-check-layout))
443 (defun find-and-init-or-check-layout (name length inherits depthoid)
444   (let ((layout (find-layout name)))
445     (init-or-check-layout layout
446                           (or (sb!xc:find-class name nil)
447                               (make-undefined-class name))
448                           length
449                           inherits
450                           depthoid)))
451
452 ;;; Record LAYOUT as the layout for its class, adding it as a subtype
453 ;;; of all superclasses. This is the operation that "installs" a
454 ;;; layout for a class in the type system, clobbering any old layout.
455 ;;; However, this does not modify the class namespace; that is a
456 ;;; separate operation (think anonymous classes.)
457 ;;; -- If INVALIDATE, then all the layouts for any old definition
458 ;;;    and subclasses are invalidated, and the SUBCLASSES slot is cleared.
459 ;;; -- If DESTRUCT-LAYOUT, then this is some old layout, and is to be
460 ;;;    destructively modified to hold the same type information.
461 (eval-when (#-sb-xc :compile-toplevel :load-toplevel :execute)
462 (defun register-layout (layout &key (invalidate t) destruct-layout)
463   (declare (type layout layout) (type (or layout null) destruct-layout))
464   (let* ((class (layout-class layout))
465          (class-layout (class-layout class))
466          (subclasses (class-subclasses class)))
467
468     ;; Attempting to register ourselves with a temporary undefined
469     ;; class placeholder is almost certainly a programmer error. (I
470     ;; should know, I did it.) -- WHN 19990927
471     (aver (not (undefined-class-p class)))
472
473     ;; This assertion dates from classic CMU CL. The rationale is
474     ;; probably that calling REGISTER-LAYOUT more than once for the
475     ;; same LAYOUT is almost certainly a programmer error.
476     (aver (not (eq class-layout layout)))
477
478     ;; Figure out what classes are affected by the change, and issue
479     ;; appropriate warnings and invalidations.
480     (when class-layout
481       (modify-class class)
482       (when subclasses
483         (dohash (subclass subclass-layout subclasses)
484           (modify-class subclass)
485           (when invalidate
486             (invalidate-layout subclass-layout))))
487       (when invalidate
488         (invalidate-layout class-layout)
489         (setf (class-subclasses class) nil)))
490
491     (if destruct-layout
492         (setf (layout-invalid destruct-layout) nil
493               (layout-inherits destruct-layout) (layout-inherits layout)
494               (layout-depthoid destruct-layout)(layout-depthoid layout)
495               (layout-length destruct-layout) (layout-length layout)
496               (layout-info destruct-layout) (layout-info layout)
497               (class-layout class) destruct-layout)
498         (setf (layout-invalid layout) nil
499               (class-layout class) layout))
500
501     (let ((inherits (layout-inherits layout)))
502       (dotimes (i (length inherits)) ; FIXME: should be DOVECTOR
503         (let* ((super (layout-class (svref inherits i)))
504                (subclasses (or (class-subclasses super)
505                                (setf (class-subclasses super)
506                                      (make-hash-table :test 'eq)))))
507           (when (and (eq (class-state super) :sealed)
508                      (not (gethash class subclasses)))
509             (warn "unsealing sealed class ~S in order to subclass it"
510                   (sb!xc:class-name super))
511             (setf (class-state super) :read-only))
512           (setf (gethash class subclasses)
513                 (or destruct-layout layout))))))
514
515   (values))
516 ); EVAL-WHEN
517
518 ;;; Arrange the inherited layouts to appear at their expected depth,
519 ;;; ensuring that hierarchical type tests succeed. Layouts with 
520 ;;; DEPTHOID >= 0 (i.e. hierarchical classes) are placed first,
521 ;;; at exactly that index in the INHERITS vector. Then, non-hierarchical
522 ;;; layouts are placed in remaining elements. Then, any still-empty
523 ;;; elements are filled with their successors, ensuring that each
524 ;;; element contains a valid layout.
525 ;;;
526 ;;; This reordering may destroy CPL ordering, so the inherits should
527 ;;; not be read as being in CPL order.
528 (defun order-layout-inherits (layouts)
529   (declare (simple-vector layouts))
530   (let ((length (length layouts))
531         (max-depth -1))
532     (dotimes (i length)
533       (let ((depth (layout-depthoid (svref layouts i))))
534         (when (> depth max-depth)
535           (setf max-depth depth))))
536     (let* ((new-length (max (1+ max-depth) length))
537            (inherits (make-array new-length)))
538       (dotimes (i length)
539         (let* ((layout (svref layouts i))
540                (depth (layout-depthoid layout)))
541           (unless (eql depth -1)
542             (let ((old-layout (svref inherits depth)))
543               (unless (or (eql old-layout 0) (eq old-layout layout))
544                 (error "layout depth conflict: ~S~%" layouts)))
545             (setf (svref inherits depth) layout))))
546       (do ((i 0 (1+ i))
547            (j 0))
548           ((>= i length))
549         (declare (type index i j))
550         (let* ((layout (svref layouts i))
551                (depth (layout-depthoid layout)))
552           (when (eql depth -1)
553             (loop (when (eql (svref inherits j) 0)
554                     (return))
555                   (incf j))
556             (setf (svref inherits j) layout))))
557       (do ((i (1- new-length) (1- i)))
558           ((< i 0))
559         (declare (type fixnum i))
560         (when (eql (svref inherits i) 0)
561           (setf (svref inherits i) (svref inherits (1+ i)))))
562       inherits)))
563 \f
564 ;;;; class precedence lists
565
566 ;;; Topologically sort the list of objects to meet a set of ordering
567 ;;; constraints given by pairs (A . B) constraining A to precede B.
568 ;;; When there are multiple objects to choose, the tie-breaker
569 ;;; function is called with both the list of object to choose from and
570 ;;; the reverse ordering built so far.
571 (defun topological-sort (objects constraints tie-breaker)
572   (declare (list objects constraints)
573            (function tie-breaker))
574   (let ((obj-info (make-hash-table :size (length objects)))
575         (free-objs nil)
576         (result nil))
577     (dolist (constraint constraints)
578       (let ((obj1 (car constraint))
579             (obj2 (cdr constraint)))
580         (let ((info2 (gethash obj2 obj-info)))
581           (if info2
582               (incf (first info2))
583               (setf (gethash obj2 obj-info) (list 1))))
584         (let ((info1 (gethash obj1 obj-info)))
585           (if info1
586               (push obj2 (rest info1))
587               (setf (gethash obj1 obj-info) (list 0 obj2))))))
588     (dolist (obj objects)
589       (let ((info (gethash obj obj-info)))
590         (when (or (not info) (zerop (first info)))
591           (push obj free-objs))))
592     (loop
593      (flet ((next-result (obj)
594               (push obj result)
595               (dolist (successor (rest (gethash obj obj-info)))
596                 (let* ((successor-info (gethash successor obj-info))
597                        (count (1- (first successor-info))))
598                   (setf (first successor-info) count)
599                   (when (zerop count)
600                     (push successor free-objs))))))
601        (cond ((endp free-objs)
602               (dohash (obj info obj-info)
603                 (unless (zerop (first info))
604                   (error "Topological sort failed due to constraint on ~S."
605                          obj)))
606               (return (nreverse result)))
607              ((endp (rest free-objs))
608               (next-result (pop free-objs)))
609              (t
610               (let ((obj (funcall tie-breaker free-objs result)))
611                 (setf free-objs (remove obj free-objs))
612                 (next-result obj))))))))
613
614
615 ;;; standard class precedence list computation
616 (defun std-compute-class-precedence-list (class)
617   (let ((classes nil)
618         (constraints nil))
619     (labels ((note-class (class)
620                (unless (member class classes)
621                  (push class classes)
622                  (let ((superclasses (class-direct-superclasses class)))
623                    (do ((prev class)
624                         (rest superclasses (rest rest)))
625                        ((endp rest))
626                      (let ((next (first rest)))
627                        (push (cons prev next) constraints)
628                        (setf prev next)))
629                    (dolist (class superclasses)
630                      (note-class class)))))
631              (std-cpl-tie-breaker (free-classes rev-cpl)
632                (dolist (class rev-cpl (first free-classes))
633                  (let* ((superclasses (class-direct-superclasses class))
634                         (intersection (intersection free-classes
635                                                     superclasses)))
636                    (when intersection
637                      (return (first intersection)))))))
638       (note-class class)
639       (topological-sort classes constraints #'std-cpl-tie-breaker))))
640 \f
641 ;;;; object types to represent classes
642
643 ;;; An UNDEFINED-CLASS is a cookie we make up to stick in forward
644 ;;; referenced layouts. Users should never see them.
645 (def!struct (undefined-class (:include #-sb-xc sb!xc:class
646                                        #+sb-xc cl:class)
647                              (:constructor make-undefined-class (%name))))
648
649 ;;; BUILT-IN-CLASS is used to represent the standard classes that
650 ;;; aren't defined with DEFSTRUCT and other specially implemented
651 ;;; primitive types whose only attribute is their name.
652 ;;;
653 ;;; Some BUILT-IN-CLASSes have a TRANSLATION, which means that they
654 ;;; are effectively DEFTYPE'd to some other type (usually a union of
655 ;;; other classes or a "primitive" type such as NUMBER, ARRAY, etc.)
656 ;;; This translation is done when type specifiers are parsed. Type
657 ;;; system operations (union, subtypep, etc.) should never encounter
658 ;;; translated classes, only their translation.
659 (def!struct (sb!xc:built-in-class (:include #-sb-xc sb!xc:class
660                                             #+sb-xc cl:class)
661                                   (:constructor bare-make-built-in-class))
662   ;; the type we translate to on parsing. If NIL, then this class
663   ;; stands on its own; or it can be set to :INITIALIZING for a period
664   ;; during cold-load.
665   (translation nil :type (or ctype (member nil :initializing))))
666 (defun make-built-in-class (&rest rest)
667   (apply #'bare-make-built-in-class
668          (rename-key-args '((:name :%name)) rest)))
669
670 ;;; FIXME: In CMU CL, this was a class with a print function, but not
671 ;;; necessarily a structure class (e.g. CONDITIONs). In SBCL,
672 ;;; we let CLOS handle our print functions, so that is no longer needed.
673 ;;; Is there any need for this class any more?
674 (def!struct (slot-class (:include #-sb-xc sb!xc:class #+sb-xc cl:class)
675                         (:constructor nil)))
676
677 ;;; STRUCTURE-CLASS represents what we need to know about structure
678 ;;; classes. Non-structure "typed" defstructs are a special case, and
679 ;;; don't have a corresponding class.
680 (def!struct (basic-structure-class (:include slot-class)
681                                    (:constructor nil)))
682
683 (def!struct (sb!xc:structure-class (:include basic-structure-class)
684                                    (:constructor bare-make-structure-class))
685   ;; If true, a default keyword constructor for this structure.
686   (constructor nil :type (or function null)))
687 (defun make-structure-class (&rest rest)
688   (apply #'bare-make-structure-class
689          (rename-key-args '((:name :%name)) rest)))
690
691 ;;; FUNCALLABLE-STRUCTURE-CLASS is used to represent funcallable
692 ;;; structures, which are used to implement generic functions.
693 (def!struct (funcallable-structure-class (:include basic-structure-class)
694                                          (:constructor bare-make-funcallable-structure-class)))
695 (defun make-funcallable-structure-class (&rest rest)
696   (apply #'bare-make-funcallable-structure-class
697          (rename-key-args '((:name :%name)) rest)))
698 \f
699 ;;;; class namespace
700
701 ;;; We use an indirection to allow forward referencing of class
702 ;;; definitions with load-time resolution.
703 (def!struct (class-cell
704              (:constructor make-class-cell (name &optional class))
705              (:make-load-form-fun (lambda (c)
706                                     `(find-class-cell ',(class-cell-name c))))
707              #-no-ansi-print-object
708              (:print-object (lambda (s stream)
709                               (print-unreadable-object (s stream :type t)
710                                 (prin1 (class-cell-name s) stream)))))
711   ;; Name of class we expect to find.
712   (name nil :type symbol :read-only t)
713   ;; Class or NIL if not yet defined.
714   (class nil :type (or #-sb-xc sb!xc:class #+sb-xc cl:class
715                        null)))
716 (defun find-class-cell (name)
717   (or (info :type :class name)
718       (setf (info :type :class name)
719             (make-class-cell name))))
720
721 ;;; FIXME: When the system is stable, this DECLAIM FTYPE should
722 ;;; probably go away in favor of the DEFKNOWN for FIND-CLASS.
723 (declaim (ftype (function (symbol &optional t (or null sb!c::lexenv))) sb!xc:find-class))
724 (eval-when (#-sb-xc :compile-toplevel :load-toplevel :execute)
725 (defun sb!xc:find-class (name &optional (errorp t) environment)
726   #!+sb-doc
727   "Return the class with the specified NAME. If ERRORP is false, then NIL is
728    returned when no such class exists."
729   (declare (type symbol name) (ignore environment))
730   (let ((res (class-cell-class (find-class-cell name))))
731     (if (or res (not errorp))
732         res
733         (error "class not yet defined:~%  ~S" name))))
734 (defun (setf sb!xc:find-class) (new-value name)
735   #-sb-xc (declare (type sb!xc:class new-value))
736   (ecase (info :type :kind name)
737     ((nil))
738     (:forthcoming-defclass-type
739      ;; XXX Currently, nothing needs to be done in this case. Later, when
740      ;; PCL is integrated tighter into SBCL, this might need more work.
741      nil)
742     (:instance
743      (let ((old (class-of (sb!xc:find-class name)))
744            (new (class-of new-value)))
745        (unless (eq old new)
746          (warn "changing meta-class of ~S from ~S to ~S"
747                name
748                (class-name old)
749                (class-name new)))))
750     (:primitive
751      (error "illegal to redefine standard type ~S" name))
752     (:defined
753      (warn "redefining DEFTYPE type to be a class: ~S" name)
754      (setf (info :type :expander name) nil)))
755
756   (remhash name *forward-referenced-layouts*)
757   (%note-type-defined name)
758   (setf (info :type :kind name) :instance)
759   (setf (class-cell-class (find-class-cell name)) new-value)
760   (unless (eq (info :type :compiler-layout name)
761               (class-layout new-value))
762     (setf (info :type :compiler-layout name) (class-layout new-value)))
763   new-value)
764 ) ; EVAL-WHEN
765
766 ;;; Called when we are about to define NAME as a class meeting some
767 ;;; predicate (such as a meta-class type test.) The first result is
768 ;;; always of the desired class. The second result is any existing
769 ;;; LAYOUT for this name.
770 (defun insured-find-class (name predicate constructor)
771   (declare (type function predicate constructor))
772   (let* ((old (sb!xc:find-class name nil))
773          (res (if (and old (funcall predicate old))
774                   old
775                   (funcall constructor :name name)))
776          (found (or (gethash name *forward-referenced-layouts*)
777                     (when old (class-layout old)))))
778     (when found
779       (setf (layout-class found) res))
780     (values res found)))
781
782 ;;; If the class has a proper name, return the name, otherwise return
783 ;;; the class.
784 (defun class-proper-name (class)
785   #-sb-xc (declare (type sb!xc:class class))
786   (let ((name (sb!xc:class-name class)))
787     (if (and name (eq (sb!xc:find-class name nil) class))
788         name
789         class)))
790 \f
791 ;;;; CLASS type operations
792
793 (!define-type-class sb!xc:class)
794
795 ;;; Simple methods for TYPE= and SUBTYPEP should never be called when
796 ;;; the two classes are equal, since there are EQ checks in those
797 ;;; operations.
798 (!define-type-method (sb!xc:class :simple-=) (type1 type2)
799   (aver (not (eq type1 type2)))
800   (values nil t))
801
802 (!define-type-method (sb!xc:class :simple-subtypep) (class1 class2)
803   (aver (not (eq class1 class2)))
804   (let ((subclasses (class-subclasses class2)))
805     (if (and subclasses (gethash class1 subclasses))
806         (values t t)
807         (values nil t))))
808
809 ;;; When finding the intersection of a sealed class and some other
810 ;;; class (not hierarchically related) the intersection is the union
811 ;;; of the currently shared subclasses.
812 (defun sealed-class-intersection2 (sealed other)
813   (declare (type sb!xc:class sealed other))
814   (let ((s-sub (class-subclasses sealed))
815         (o-sub (class-subclasses other)))
816     (if (and s-sub o-sub)
817         (collect ((res *empty-type* type-union))
818           (dohash (subclass layout s-sub)
819             (declare (ignore layout))
820             (when (gethash subclass o-sub)
821               (res (specifier-type subclass))))
822           (res))
823         *empty-type*)))
824
825 (!define-type-method (sb!xc:class :simple-intersection2) (class1 class2)
826   (declare (type sb!xc:class class1 class2))
827   (cond ((eq class1 class2)
828          class1)
829         ;; If one is a subclass of the other, then that is the
830         ;; intersection.
831         ((let ((subclasses (class-subclasses class2)))
832            (and subclasses (gethash class1 subclasses)))
833          class1)
834         ((let ((subclasses (class-subclasses class1)))
835            (and subclasses (gethash class2 subclasses)))
836          class2)
837         ;; Otherwise, we can't in general be sure that the
838         ;; intersection is empty, since a subclass of both might be
839         ;; defined. But we can eliminate it for some special cases.
840         ((or (basic-structure-class-p class1)
841              (basic-structure-class-p class2))
842          ;; No subclass of both can be defined.
843          *empty-type*)
844         ((eq (class-state class1) :sealed)
845          ;; checking whether a subclass of both can be defined:
846          (sealed-class-intersection2 class1 class2))
847         ((eq (class-state class2) :sealed)
848          ;; checking whether a subclass of both can be defined:
849          (sealed-class-intersection2 class2 class1))
850         (t
851          ;; uncertain, since a subclass of both might be defined
852          nil)))
853
854 (!define-type-method (sb!xc:class :unparse) (type)
855   (class-proper-name type))
856 \f
857 ;;;; PCL stuff
858
859 (def!struct (std-class (:include sb!xc:class)
860                        (:constructor nil)))
861 (def!struct (sb!xc:standard-class (:include std-class)
862                                   (:constructor bare-make-standard-class)))
863 (def!struct (random-pcl-class (:include std-class)
864                               (:constructor bare-make-random-pcl-class)))
865 (defun make-standard-class (&rest rest)
866   (apply #'bare-make-standard-class
867          (rename-key-args '((:name :%name)) rest)))
868 (defun make-random-pcl-class (&rest rest)
869   (apply #'bare-make-random-pcl-class
870          (rename-key-args '((:name :%name)) rest)))
871 \f
872 ;;;; built-in classes
873
874 ;;; The BUILT-IN-CLASSES list is a data structure which configures the
875 ;;; creation of all the built-in classes. It contains all the info
876 ;;; that we need to maintain the mapping between classes, compile-time
877 ;;; types and run-time type codes. These options are defined:
878 ;;;
879 ;;; :TRANSLATION (default none)
880 ;;;     When this class is "parsed" as a type specifier, it is
881 ;;;     translated into the specified internal type representation,
882 ;;;     rather than being left as a class. This is used for types
883 ;;;     which we want to canonicalize to some other kind of type
884 ;;;     object because in general we want to be able to include more
885 ;;;     information than just the class (e.g. for numeric types.)
886 ;;;
887 ;;; :ENUMERABLE (default NIL)
888 ;;;     The value of the :ENUMERABLE slot in the created class.
889 ;;;     Meaningless in translated classes.
890 ;;;
891 ;;; :STATE (default :SEALED)
892 ;;;     The value of CLASS-STATE which we want on completion,
893 ;;;     indicating whether subclasses can be created at run-time.
894 ;;;
895 ;;; :HIERARCHICAL-P (default T unless any of the inherits are non-hierarchical)
896 ;;;     True if we can assign this class a unique inheritance depth.
897 ;;;
898 ;;; :CODES (default none)
899 ;;;     Run-time type codes which should be translated back to this
900 ;;;     class by CLASS-OF. Unspecified for abstract classes.
901 ;;;
902 ;;; :INHERITS (default this class and T)
903 ;;;     The class-precedence list for this class, with this class and
904 ;;;     T implicit.
905 ;;;
906 ;;; :DIRECT-SUPERCLASSES (default to head of CPL)
907 ;;;     List of the direct superclasses of this class.
908 ;;;
909 ;;; FIXME: This doesn't seem to be needed after cold init (and so can
910 ;;; probably be uninterned at the end of cold init).
911 (defvar *built-in-classes*)
912 (!cold-init-forms
913   (/show0 "setting *BUILT-IN-CLASSES*")
914   (setq
915    *built-in-classes*
916    '((t :state :read-only :translation t)
917      (character :enumerable t :translation base-char)
918      (base-char :enumerable t
919                 :inherits (character)
920                 :codes (#.sb!vm:base-char-widetag))
921      (symbol :codes (#.sb!vm:symbol-header-widetag))
922
923      (instance :state :read-only)
924
925      (system-area-pointer :codes (#.sb!vm:sap-widetag))
926      (weak-pointer :codes (#.sb!vm:weak-pointer-widetag))
927      (code-component :codes (#.sb!vm:code-header-widetag))
928      (lra :codes (#.sb!vm:return-pc-header-widetag))
929      (fdefn :codes (#.sb!vm:fdefn-widetag))
930      (random-class) ; used for unknown type codes
931
932      (function
933       :codes (#.sb!vm:closure-header-widetag
934               #.sb!vm:simple-fun-header-widetag)
935       :state :read-only)
936      (funcallable-instance
937       :inherits (function)
938       :state :read-only)
939
940      ;; FIXME: Are COLLECTION and MUTABLE-COLLECTION used for anything
941      ;; any more? COLLECTION is not defined in ANSI Common Lisp..
942      (collection :hierarchical-p nil :state :read-only)
943      (mutable-collection :state :read-only
944                          :inherits (collection))
945      (generic-sequence :state :read-only
946                        :inherits (collection))
947      (mutable-sequence :state :read-only
948                        :direct-superclasses (mutable-collection
949                                              generic-sequence)
950                        :inherits (mutable-collection
951                                   generic-sequence
952                                   collection))
953      (generic-array :state :read-only
954                     :inherits (mutable-sequence
955                                mutable-collection
956                                generic-sequence
957                                collection))
958      (generic-vector :state :read-only
959                      :inherits (generic-array
960                                 mutable-sequence mutable-collection
961                                 generic-sequence collection))
962      (array :translation array :codes (#.sb!vm:complex-array-widetag)
963             :inherits (generic-array mutable-sequence mutable-collection
964                                      generic-sequence collection))
965      (simple-array
966       :translation simple-array :codes (#.sb!vm:simple-array-widetag)
967       :inherits (array generic-array mutable-sequence mutable-collection
968                  generic-sequence collection))
969      (sequence
970       :translation (or cons (member nil) vector)
971       :inherits (mutable-sequence mutable-collection generic-sequence
972                  collection))
973      (vector
974       :translation vector :codes (#.sb!vm:complex-vector-widetag)
975       :direct-superclasses (array sequence generic-vector)
976       :inherits (array sequence generic-vector generic-array
977                  mutable-sequence mutable-collection generic-sequence
978                  collection))
979      (simple-vector
980       :translation simple-vector :codes (#.sb!vm:simple-vector-widetag)
981       :direct-superclasses (vector simple-array)
982       :inherits (vector simple-array array
983                  sequence generic-vector generic-array
984                  mutable-sequence mutable-collection
985                  generic-sequence collection))
986      (bit-vector
987       :translation bit-vector :codes (#.sb!vm:complex-bit-vector-widetag)
988       :inherits (vector array sequence
989                  generic-vector generic-array mutable-sequence
990                  mutable-collection generic-sequence collection))
991      (simple-bit-vector
992       :translation simple-bit-vector :codes (#.sb!vm:simple-bit-vector-widetag)
993       :direct-superclasses (bit-vector simple-array)
994       :inherits (bit-vector vector simple-array
995                  array sequence
996                  generic-vector generic-array mutable-sequence
997                  mutable-collection generic-sequence collection))
998      (simple-array-unsigned-byte-2
999       :translation (simple-array (unsigned-byte 2) (*))
1000       :codes (#.sb!vm:simple-array-unsigned-byte-2-widetag)
1001       :direct-superclasses (vector simple-array)
1002       :inherits (vector simple-array array sequence
1003                  generic-vector generic-array mutable-sequence
1004                  mutable-collection generic-sequence collection))
1005      (simple-array-unsigned-byte-4
1006       :translation (simple-array (unsigned-byte 4) (*))
1007       :codes (#.sb!vm:simple-array-unsigned-byte-4-widetag)
1008       :direct-superclasses (vector simple-array)
1009       :inherits (vector simple-array array sequence
1010                  generic-vector generic-array mutable-sequence
1011                  mutable-collection generic-sequence collection))
1012      (simple-array-unsigned-byte-8
1013       :translation (simple-array (unsigned-byte 8) (*))
1014       :codes (#.sb!vm:simple-array-unsigned-byte-8-widetag)
1015       :direct-superclasses (vector simple-array)
1016       :inherits (vector simple-array array sequence
1017                  generic-vector generic-array mutable-sequence
1018                  mutable-collection generic-sequence collection))
1019      (simple-array-unsigned-byte-16
1020      :translation (simple-array (unsigned-byte 16) (*))
1021      :codes (#.sb!vm:simple-array-unsigned-byte-16-widetag)
1022      :direct-superclasses (vector simple-array)
1023      :inherits (vector simple-array array sequence
1024                 generic-vector generic-array mutable-sequence
1025                 mutable-collection generic-sequence collection))
1026      (simple-array-unsigned-byte-32
1027      :translation (simple-array (unsigned-byte 32) (*))
1028      :codes (#.sb!vm:simple-array-unsigned-byte-32-widetag)
1029      :direct-superclasses (vector simple-array)
1030      :inherits (vector simple-array array sequence
1031                 generic-vector generic-array mutable-sequence
1032                 mutable-collection generic-sequence collection))
1033      (simple-array-signed-byte-8
1034      :translation (simple-array (signed-byte 8) (*))
1035      :codes (#.sb!vm:simple-array-signed-byte-8-widetag)
1036      :direct-superclasses (vector simple-array)
1037      :inherits (vector simple-array array sequence
1038                 generic-vector generic-array mutable-sequence
1039                 mutable-collection generic-sequence collection))
1040      (simple-array-signed-byte-16
1041      :translation (simple-array (signed-byte 16) (*))
1042      :codes (#.sb!vm:simple-array-signed-byte-16-widetag)
1043      :direct-superclasses (vector simple-array)
1044      :inherits (vector simple-array array sequence
1045                 generic-vector generic-array mutable-sequence
1046                 mutable-collection generic-sequence collection))
1047      (simple-array-signed-byte-30
1048      :translation (simple-array (signed-byte 30) (*))
1049      :codes (#.sb!vm:simple-array-signed-byte-30-widetag)
1050      :direct-superclasses (vector simple-array)
1051      :inherits (vector simple-array array sequence
1052                 generic-vector generic-array mutable-sequence
1053                 mutable-collection generic-sequence collection))
1054      (simple-array-signed-byte-32
1055      :translation (simple-array (signed-byte 32) (*))
1056      :codes (#.sb!vm:simple-array-signed-byte-32-widetag)
1057      :direct-superclasses (vector simple-array)
1058      :inherits (vector simple-array array sequence
1059                 generic-vector generic-array mutable-sequence
1060                 mutable-collection generic-sequence collection))
1061      (simple-array-single-float
1062      :translation (simple-array single-float (*))
1063      :codes (#.sb!vm:simple-array-single-float-widetag)
1064      :direct-superclasses (vector simple-array)
1065      :inherits (vector simple-array array sequence
1066                 generic-vector generic-array mutable-sequence
1067                 mutable-collection generic-sequence collection))
1068      (simple-array-double-float
1069      :translation (simple-array double-float (*))
1070      :codes (#.sb!vm:simple-array-double-float-widetag)
1071      :direct-superclasses (vector simple-array)
1072      :inherits (vector simple-array array sequence
1073                 generic-vector generic-array mutable-sequence
1074                 mutable-collection generic-sequence collection))
1075     #!+long-float
1076     (simple-array-long-float
1077      :translation (simple-array long-float (*))
1078      :codes (#.sb!vm:simple-array-long-float-widetag)
1079      :direct-superclasses (vector simple-array)
1080      :inherits (vector simple-array array sequence
1081                 generic-vector generic-array mutable-sequence
1082                 mutable-collection generic-sequence collection))
1083     (simple-array-complex-single-float
1084      :translation (simple-array (complex single-float) (*))
1085      :codes (#.sb!vm:simple-array-complex-single-float-widetag)
1086      :direct-superclasses (vector simple-array)
1087      :inherits (vector simple-array array sequence
1088                 generic-vector generic-array mutable-sequence
1089                 mutable-collection generic-sequence collection))
1090     (simple-array-complex-double-float
1091      :translation (simple-array (complex double-float) (*))
1092      :codes (#.sb!vm:simple-array-complex-double-float-widetag)
1093      :direct-superclasses (vector simple-array)
1094      :inherits (vector simple-array array sequence
1095                 generic-vector generic-array mutable-sequence
1096                 mutable-collection generic-sequence collection))
1097     #!+long-float
1098     (simple-array-complex-long-float
1099      :translation (simple-array (complex long-float) (*))
1100      :codes (#.sb!vm:simple-array-complex-long-float-widetag)
1101      :direct-superclasses (vector simple-array)
1102      :inherits (vector simple-array array sequence
1103                 generic-vector generic-array mutable-sequence
1104                 mutable-collection generic-sequence collection))
1105     (generic-string
1106      :state :read-only
1107      :inherits (mutable-sequence mutable-collection generic-sequence
1108                 collection))
1109     (string
1110      :translation string
1111      :codes (#.sb!vm:complex-string-widetag)
1112      :direct-superclasses (vector generic-string)
1113      :inherits (vector array sequence
1114                 generic-vector generic-array generic-string
1115                 mutable-sequence mutable-collection
1116                 generic-sequence collection))
1117     (simple-string
1118      :translation simple-string
1119      :codes (#.sb!vm:simple-string-widetag)
1120      :direct-superclasses (string simple-array)
1121      :inherits (string vector simple-array
1122                 array sequence
1123                 generic-string generic-vector generic-array mutable-sequence
1124                 mutable-collection generic-sequence collection))
1125     (list
1126      :translation (or cons (member nil))
1127      :inherits (sequence mutable-sequence mutable-collection
1128                 generic-sequence collection))
1129     (cons
1130      :codes (#.sb!vm:list-pointer-lowtag)
1131      :translation cons
1132      :inherits (list sequence
1133                 mutable-sequence mutable-collection
1134                 generic-sequence collection))
1135     (null
1136      :translation (member nil)
1137      :inherits (symbol list sequence
1138                 mutable-sequence mutable-collection
1139                 generic-sequence collection)
1140      :direct-superclasses (symbol list))
1141     (generic-number :state :read-only)
1142     (number :translation number :inherits (generic-number))
1143     (complex
1144      :translation complex
1145      :inherits (number generic-number)
1146      :codes (#.sb!vm:complex-widetag))
1147     (complex-single-float
1148      :translation (complex single-float)
1149      :inherits (complex number generic-number)
1150      :codes (#.sb!vm:complex-single-float-widetag))
1151     (complex-double-float
1152      :translation (complex double-float)
1153      :inherits (complex number generic-number)
1154      :codes (#.sb!vm:complex-double-float-widetag))
1155     #!+long-float
1156     (complex-long-float
1157      :translation (complex long-float)
1158      :inherits (complex number generic-number)
1159      :codes (#.sb!vm:complex-long-float-widetag))
1160     (real :translation real :inherits (number generic-number))
1161     (float
1162      :translation float
1163      :inherits (real number generic-number))
1164     (single-float
1165      :translation single-float
1166      :inherits (float real number generic-number)
1167      :codes (#.sb!vm:single-float-widetag))
1168     (double-float
1169      :translation double-float
1170      :inherits (float real number generic-number)
1171      :codes (#.sb!vm:double-float-widetag))
1172     #!+long-float
1173     (long-float
1174      :translation long-float
1175      :inherits (float real number generic-number)
1176      :codes (#.sb!vm:long-float-widetag))
1177     (rational
1178      :translation rational
1179      :inherits (real number generic-number))
1180     (ratio
1181      :translation (and rational (not integer))
1182      :inherits (rational real number generic-number)
1183      :codes (#.sb!vm:ratio-widetag))
1184     (integer
1185      :translation integer
1186      :inherits (rational real number generic-number))
1187     (fixnum
1188      :translation (integer #.sb!xc:most-negative-fixnum
1189                            #.sb!xc:most-positive-fixnum)
1190      :inherits (integer rational real number
1191                 generic-number)
1192      :codes (#.sb!vm:even-fixnum-lowtag #.sb!vm:odd-fixnum-lowtag))
1193     (bignum
1194      :translation (and integer (not fixnum))
1195      :inherits (integer rational real number
1196                 generic-number)
1197      :codes (#.sb!vm:bignum-widetag))
1198     (stream
1199      :state :read-only
1200      :depth 3
1201      :inherits (instance)))))
1202
1203 ;;; comment from CMU CL:
1204 ;;;   See also type-init.lisp where we finish setting up the
1205 ;;;   translations for built-in types.
1206 (!cold-init-forms
1207   (dolist (x *built-in-classes*)
1208     #-sb-xc-host (/show0 "at head of loop over *BUILT-IN-CLASSES*")
1209     (destructuring-bind
1210         (name &key
1211               (translation nil trans-p)
1212               inherits
1213               codes
1214               enumerable
1215               state
1216               depth
1217               (hierarchical-p t) ; might be modified below
1218               (direct-superclasses (if inherits
1219                                      (list (car inherits))
1220                                      '(t))))
1221         x
1222       (declare (ignore codes state translation))
1223       (let ((inherits-list (if (eq name t)
1224                                ()
1225                                (cons t (reverse inherits))))
1226             (class (make-built-in-class
1227                     :enumerable enumerable
1228                     :name name
1229                     :translation (if trans-p :initializing nil)
1230                     :direct-superclasses
1231                     (if (eq name t)
1232                       nil
1233                       (mapcar #'sb!xc:find-class direct-superclasses)))))
1234         (setf (info :type :kind name) :primitive
1235               (class-cell-class (find-class-cell name)) class)
1236         (unless trans-p
1237           (setf (info :type :builtin name) class))
1238         (let* ((inherits-vector
1239                 (map 'simple-vector
1240                      (lambda (x)
1241                        (let ((super-layout
1242                               (class-layout (sb!xc:find-class x))))
1243                          (when (minusp (layout-depthoid super-layout))
1244                            (setf hierarchical-p nil))
1245                          super-layout))
1246                      inherits-list))
1247                (depthoid (if hierarchical-p
1248                            (or depth (length inherits-vector))
1249                            -1)))
1250           (register-layout
1251            (find-and-init-or-check-layout name
1252                                           0
1253                                           inherits-vector
1254                                           depthoid)
1255            :invalidate nil)))))
1256   (/show0 "done with loop over *BUILT-IN-CLASSES*"))
1257
1258 ;;; Define temporary PCL STANDARD-CLASSes. These will be set up
1259 ;;; correctly and the Lisp layout replaced by a PCL wrapper after PCL
1260 ;;; is loaded and the class defined.
1261 (!cold-init-forms
1262   (/show0 "about to define temporary STANDARD-CLASSes")
1263   (dolist (x '(;; Why is STREAM duplicated in this list? Because, when
1264                ;; the inherits-vector of FUNDAMENTAL-STREAM is set up,
1265                ;; a vector containing the elements of the list below,
1266                ;; i.e. '(T INSTANCE STREAM STREAM), is created, and
1267                ;; this is what the function ORDER-LAYOUT-INHERITS
1268                ;; would do, too.
1269                ;;
1270                ;; So, the purpose is to guarantee a valid layout for
1271                ;; the FUNDAMENTAL-STREAM class, matching what
1272                ;; ORDER-LAYOUT-INHERITS would do.
1273                ;; ORDER-LAYOUT-INHERITS would place STREAM at index 3
1274                ;; in the INHERITS(-VECTOR). Index 2 would not be
1275                ;; filled, so STREAM is duplicated there (as
1276                ;; ORDER-LAYOUTS-INHERITS would do). Maybe the
1277                ;; duplicate definition could be removed (removing a
1278                ;; STREAM element), because FUNDAMENTAL-STREAM is
1279                ;; redefined after PCL is set up, anyway. But to play
1280                ;; it safely, we define the class with a valid INHERITS
1281                ;; vector.
1282                (fundamental-stream (t instance stream stream))))
1283     (/show0 "defining temporary STANDARD-CLASS")
1284     (let* ((name (first x))
1285            (inherits-list (second x))
1286            (class (make-standard-class :name name))
1287            (class-cell (find-class-cell name)))
1288       (setf (class-cell-class class-cell) class
1289             (info :type :class name) class-cell
1290             (info :type :kind name) :instance)
1291       (let ((inherits (map 'simple-vector
1292                            (lambda (x)
1293                              (class-layout (sb!xc:find-class x)))
1294                            inherits-list)))
1295         #-sb-xc-host (/show0 "INHERITS=..") #-sb-xc-host (/hexstr inherits)
1296         (register-layout (find-and-init-or-check-layout name 0 inherits -1)
1297                          :invalidate nil))))
1298   (/show0 "done defining temporary STANDARD-CLASSes"))
1299
1300 ;;; Now that we have set up the class heterarchy, seal the sealed
1301 ;;; classes. This must be done after the subclasses have been set up.
1302 (!cold-init-forms
1303   (dolist (x *built-in-classes*)
1304     (destructuring-bind (name &key (state :sealed) &allow-other-keys) x
1305       (setf (class-state (sb!xc:find-class name)) state))))
1306 \f
1307 ;;;; class definition/redefinition
1308
1309 ;;; This is to be called whenever we are altering a class.
1310 (defun modify-class (class)
1311   (clear-type-caches)
1312   (when (member (class-state class) '(:read-only :frozen))
1313     ;; FIXME: This should probably be CERROR.
1314     (warn "making ~(~A~) class ~S writable"
1315           (class-state class)
1316           (sb!xc:class-name class))
1317     (setf (class-state class) nil)))
1318
1319 ;;; Mark LAYOUT as invalid. Setting DEPTHOID -1 helps cause unsafe
1320 ;;; structure type tests to fail. Remove class from all superclasses
1321 ;;; too (might not be registered, so might not be in subclasses of the
1322 ;;; nominal superclasses.)
1323 (defun invalidate-layout (layout)
1324   (declare (type layout layout))
1325   (setf (layout-invalid layout) t
1326         (layout-depthoid layout) -1)
1327   (let ((inherits (layout-inherits layout))
1328         (class (layout-class layout)))
1329     (modify-class class)
1330     (dotimes (i (length inherits)) ; FIXME: DOVECTOR
1331       (let* ((super (svref inherits i))
1332              (subs (class-subclasses (layout-class super))))
1333         (when subs
1334           (remhash class subs)))))
1335   (values))
1336 \f
1337 ;;;; cold loading initializations
1338
1339 ;;; FIXME: It would be good to arrange for this to be called when the
1340 ;;; cross-compiler is being built, not just when the target Lisp is
1341 ;;; being cold loaded. Perhaps this could be moved to its own file
1342 ;;; late in the build-order.lisp-expr sequence, and be put in
1343 ;;; !COLD-INIT-FORMS there?
1344 (defun !class-finalize ()
1345   (dohash (name layout *forward-referenced-layouts*)
1346     (let ((class (sb!xc:find-class name nil)))
1347       (cond ((not class)
1348              (setf (layout-class layout) (make-undefined-class name)))
1349             ((eq (class-layout class) layout)
1350              (remhash name *forward-referenced-layouts*))
1351             (t
1352              ;; FIXME: ERROR?
1353              (warn "something strange with forward layout for ~S:~%  ~S"
1354                    name
1355                    layout))))))
1356
1357 ;;; a vector that maps type codes to layouts, used for quickly finding
1358 ;;; the layouts of built-in classes
1359 (defvar *built-in-class-codes*) ; initialized in cold load
1360 (declaim (type simple-vector *built-in-class-codes*))
1361
1362 (!cold-init-forms
1363   #-sb-xc-host (/show0 "about to set *BUILT-IN-CLASS-CODES*")
1364   (setq *built-in-class-codes*
1365         (let* ((initial-element
1366                 (locally
1367                   ;; KLUDGE: There's a FIND-CLASS DEFTRANSFORM for
1368                   ;; constant class names which creates fast but
1369                   ;; non-cold-loadable, non-compact code. In this
1370                   ;; context, we'd rather have compact, cold-loadable
1371                   ;; code. -- WHN 19990928
1372                   (declare (notinline sb!xc:find-class))
1373                   (class-layout (sb!xc:find-class 'random-class))))
1374                (res (make-array 256 :initial-element initial-element)))
1375           (dolist (x *built-in-classes* res)
1376             (destructuring-bind (name &key codes &allow-other-keys)
1377                                 x
1378               (let ((layout (class-layout (sb!xc:find-class name))))
1379                 (dolist (code codes)
1380                   (setf (svref res code) layout)))))))
1381   #-sb-xc-host (/show0 "done setting *BUILT-IN-CLASS-CODES*"))
1382 \f
1383 (!defun-from-collected-cold-init-forms !classes-cold-init)