1 ;;;; various extensions (including SB-INT "internal extensions")
2 ;;;; available both in the cross-compilation host Lisp and in the
5 ;;;; This software is part of the SBCL system. See the README file for
8 ;;;; This software is derived from the CMU CL system, which was
9 ;;;; written at Carnegie Mellon University and released into the
10 ;;;; public domain. The software is in the public domain and is
11 ;;;; provided with absolutely no warranty. See the COPYING and CREDITS
12 ;;;; files for more information.
14 (in-package "SB!IMPL")
16 ;;; something not EQ to anything we might legitimately READ
17 (defparameter *eof-object
* (make-symbol "EOF-OBJECT"))
19 ;;; a type used for indexing into arrays, and for related quantities
20 ;;; like lengths of lists
22 ;;; It's intentionally limited to one less than the
23 ;;; ARRAY-DIMENSION-LIMIT for efficiency reasons, because in SBCL
24 ;;; ARRAY-DIMENSION-LIMIT is MOST-POSITIVE-FIXNUM, and staying below
25 ;;; that lets the system know it can increment a value of this type
26 ;;; without having to worry about using a bignum to represent the
29 ;;; (It should be safe to use ARRAY-DIMENSION-LIMIT as an exclusive
30 ;;; bound because ANSI specifies it as an exclusive bound.)
31 (def!type index
() `(integer 0 (,sb
!xc
:array-dimension-limit
)))
33 ;;; like INDEX, but only up to half the maximum. Used by hash-table
34 ;;; code that does plenty to (aref v (* 2 i)) and (aref v (1+ (* 2 i))).
35 (def!type index
/2 () `(integer 0 (,(floor sb
!xc
:array-dimension-limit
2))))
37 ;;; like INDEX, but augmented with -1 (useful when using the index
38 ;;; to count downwards to 0, e.g. LOOP FOR I FROM N DOWNTO 0, with
39 ;;; an implementation which terminates the loop by testing for the
40 ;;; index leaving the loop range)
41 (def!type index-or-minus-1
() `(integer -
1 (,sb
!xc
:array-dimension-limit
)))
43 ;;; A couple of VM-related types that are currently used only on the
44 ;;; alpha platform. -- CSR, 2002-06-24
45 (def!type unsigned-byte-with-a-bite-out
(s bite
)
46 (cond ((eq s
'*) 'integer
)
47 ((and (integerp s
) (> s
0))
48 (let ((bound (ash 1 s
)))
49 `(integer 0 ,(- bound bite
1))))
51 (error "Bad size specified for UNSIGNED-BYTE type specifier: ~S." s
))))
53 ;;; Motivated by the mips port. -- CSR, 2002-08-22
54 (def!type signed-byte-with-a-bite-out
(s bite
)
55 (cond ((eq s
'*) 'integer
)
56 ((and (integerp s
) (> s
1))
57 (let ((bound (ash 1 (1- s
))))
58 `(integer ,(- bound
) ,(- bound bite
1))))
60 (error "Bad size specified for SIGNED-BYTE type specifier: ~S." s
))))
62 (def!type load
/store-index
(scale lowtag min-offset
63 &optional
(max-offset min-offset
))
64 `(integer ,(- (truncate (+ (ash 1 16)
65 (* min-offset sb
!vm
:n-word-bytes
)
68 ,(truncate (- (+ (1- (ash 1 16)) lowtag
)
69 (* max-offset sb
!vm
:n-word-bytes
))
73 (defun displacement-bounds (lowtag element-size data-offset
)
74 (let* ((adjustment (- (* data-offset sb
!vm
:n-word-bytes
) lowtag
))
75 (bytes-per-element (ceiling element-size sb
!vm
:n-byte-bits
))
76 (min (truncate (+ sb
!vm
::minimum-immediate-offset adjustment
)
78 (max (truncate (+ sb
!vm
::maximum-immediate-offset adjustment
)
83 (def!type constant-displacement
(lowtag element-size data-offset
)
84 (flet ((integerify (x)
87 (symbol (symbol-value x
)))))
88 (let ((lowtag (integerify lowtag
))
89 (element-size (integerify element-size
))
90 (data-offset (integerify data-offset
)))
91 (multiple-value-bind (min max
) (displacement-bounds lowtag
94 `(integer ,min
,max
)))))
96 ;;; Similar to FUNCTION, but the result type is "exactly" specified:
97 ;;; if it is an object type, then the function returns exactly one
98 ;;; value, if it is a short form of VALUES, then this short form
99 ;;; specifies the exact number of values.
100 (def!type sfunction
(args &optional result
)
101 (let ((result (cond ((eq result
'*) '*)
103 (not (eq (car result
) 'values
)))
104 `(values ,result
&optional
))
105 ((intersection (cdr result
) lambda-list-keywords
)
107 (t `(values ,@(cdr result
) &optional
)))))
108 `(function ,args
,result
)))
112 ;;; FIXME: The SB!KERNEL:INSTANCE here really means CL:CLASS.
113 ;;; However, the CL:CLASS type is only defined once PCL is loaded,
114 ;;; which is before this is evaluated. Once PCL is moved into cold
115 ;;; init, this might be fixable.
116 (def!type type-specifier
() '(or list symbol sb
!kernel
:instance
))
118 ;;; the default value used for initializing character data. The ANSI
119 ;;; spec says this is arbitrary, so we use the value that falls
120 ;;; through when we just let the low-level consing code initialize
121 ;;; all newly-allocated memory to zero.
123 ;;; KLUDGE: It might be nice to use something which is a
124 ;;; STANDARD-CHAR, both to reduce user surprise a little and, probably
125 ;;; more significantly, to help SBCL's cross-compiler (which knows how
126 ;;; to dump STANDARD-CHARs). Unfortunately, the old CMU CL code is
127 ;;; shot through with implicit assumptions that it's #\NULL, and code
128 ;;; in several places (notably both DEFUN MAKE-ARRAY and DEFTRANSFORM
129 ;;; MAKE-ARRAY) would have to be rewritten. -- WHN 2001-10-04
130 (eval-when (:compile-toplevel
:load-toplevel
:execute
)
131 ;; an expression we can use to construct a DEFAULT-INIT-CHAR value
132 ;; at load time (so that we don't need to teach the cross-compiler
133 ;; how to represent and dump non-STANDARD-CHARs like #\NULL)
134 (defparameter *default-init-char-form
* '(code-char 0)))
136 ;;; CHAR-CODE values for ASCII characters which we care about but
137 ;;; which aren't defined in section "2.1.3 Standard Characters" of the
138 ;;; ANSI specification for Lisp
140 ;;; KLUDGE: These are typically used in the idiom (CODE-CHAR
141 ;;; FOO-CHAR-CODE). I suspect that the current implementation is
142 ;;; expanding this idiom into a full call to CODE-CHAR, which is an
143 ;;; annoying overhead. I should check whether this is happening, and
144 ;;; if so, perhaps implement a DEFTRANSFORM or something to stop it.
145 ;;; (or just find a nicer way of expressing characters portably?) --
147 (def!constant bell-char-code
7)
148 (def!constant backspace-char-code
8)
149 (def!constant tab-char-code
9)
150 (def!constant line-feed-char-code
10)
151 (def!constant form-feed-char-code
12)
152 (def!constant return-char-code
13)
153 (def!constant escape-char-code
27)
154 (def!constant rubout-char-code
127)
156 ;;;; type-ish predicates
158 ;;; X may contain cycles -- a conservative approximation. This
159 ;;; occupies a somewhat uncomfortable niche between being fast for
160 ;;; common cases (we don't want to allocate a hash-table), and not
161 ;;; falling down to exponential behaviour for large trees (so we set
162 ;;; an arbitrady depth limit beyond which we punt).
163 (defun maybe-cyclic-p (x &optional
(depth-limit 12))
165 (labels ((safe-cddr (cons)
166 (let ((cdr (cdr cons
)))
169 (check-cycle (object seen depth
)
170 (when (and (consp object
)
171 (or (> depth depth-limit
)
173 (circularp object seen depth
)))
174 (return-from maybe-cyclic-p t
)))
175 (circularp (list seen depth
)
176 ;; Almost regular circular list detection, with a twist:
177 ;; we also check each element of the list for upward
178 ;; references using CHECK-CYCLE.
179 (do ((fast (cons (car list
) (cdr list
)) (safe-cddr fast
))
180 (slow list
(cdr slow
)))
182 ;; Not CDR-circular, need to check remaining CARs yet
183 (do ((tail slow
(and (cdr tail
))))
186 (check-cycle (car tail
) (cons tail seen
) (1+ depth
))))
187 (check-cycle (car slow
) (cons slow seen
) (1+ depth
))
190 (circularp x
(list x
) 0))))
192 ;;; Is X a (possibly-improper) list of at least N elements?
193 (declaim (ftype (function (t index
)) list-of-length-at-least-p
))
194 (defun list-of-length-at-least-p (x n
)
195 (or (zerop n
) ; since anything can be considered an improper list of length 0
197 (list-of-length-at-least-p (cdr x
) (1- n
)))))
199 (declaim (inline singleton-p
))
200 (defun singleton-p (list)
204 ;;; Is X is a positive prime integer?
205 (defun positive-primep (x)
206 ;; This happens to be called only from one place in sbcl-0.7.0, and
207 ;; only for fixnums, we can limit it to fixnums for efficiency. (And
208 ;; if we didn't limit it to fixnums, we should use a cleverer
209 ;; algorithm, since this one scales pretty badly for huge X.)
212 (and (>= x
2) (/= x
4))
214 (not (zerop (rem x
3)))
217 (inc 2 (logxor inc
6)) ;; 2,4,2,4...
219 ((or (= r
0) (> d q
)) (/= r
0))
220 (declare (fixnum inc
))
221 (multiple-value-setq (q r
) (truncate x d
))))))
223 ;;; Could this object contain other objects? (This is important to
224 ;;; the implementation of things like *PRINT-CIRCLE* and the dumper.)
225 (defun compound-object-p (x)
228 (typep x
'(array t
*))))
230 ;;;; the COLLECT macro
232 ;;;; comment from CMU CL: "the ultimate collection macro..."
234 ;;; helper functions for COLLECT, which become the expanders of the
235 ;;; MACROLET definitions created by COLLECT
237 ;;; COLLECT-NORMAL-EXPANDER handles normal collection macros.
239 ;;; COLLECT-LIST-EXPANDER handles the list collection case. N-TAIL
240 ;;; is the pointer to the current tail of the list, or NIL if the list
242 (eval-when (#-sb-xc
:compile-toplevel
:load-toplevel
:execute
)
243 (defun collect-normal-expander (n-value fun forms
)
245 ,@(mapcar (lambda (form) `(setq ,n-value
(,fun
,form
,n-value
))) forms
)
247 (defun collect-list-expander (n-value n-tail forms
)
248 (let ((n-res (gensym)))
250 ,@(mapcar (lambda (form)
251 `(let ((,n-res
(cons ,form nil
)))
253 (setf (cdr ,n-tail
) ,n-res
)
254 (setq ,n-tail
,n-res
))
256 (setq ,n-tail
,n-res
,n-value
,n-res
)))))
260 ;;; Collect some values somehow. Each of the collections specifies a
261 ;;; bunch of things which collected during the evaluation of the body
262 ;;; of the form. The name of the collection is used to define a local
263 ;;; macro, a la MACROLET. Within the body, this macro will evaluate
264 ;;; each of its arguments and collect the result, returning the
265 ;;; current value after the collection is done. The body is evaluated
266 ;;; as a PROGN; to get the final values when you are done, just call
267 ;;; the collection macro with no arguments.
269 ;;; INITIAL-VALUE is the value that the collection starts out with,
270 ;;; which defaults to NIL. FUNCTION is the function which does the
271 ;;; collection. It is a function which will accept two arguments: the
272 ;;; value to be collected and the current collection. The result of
273 ;;; the function is made the new value for the collection. As a
274 ;;; totally magical special-case, FUNCTION may be COLLECT, which tells
275 ;;; us to build a list in forward order; this is the default. If an
276 ;;; INITIAL-VALUE is supplied for COLLECT, the stuff will be RPLACD'd
277 ;;; onto the end. Note that FUNCTION may be anything that can appear
278 ;;; in the functional position, including macros and lambdas.
279 (defmacro collect
(collections &body body
)
282 (dolist (spec collections
)
283 (unless (proper-list-of-length-p spec
1 3)
284 (error "malformed collection specifier: ~S" spec
))
285 (let* ((name (first spec
))
286 (default (second spec
))
287 (kind (or (third spec
) 'collect
))
288 (n-value (gensym (concatenate 'string
291 (push `(,n-value
,default
) binds
)
292 (if (eq kind
'collect
)
293 (let ((n-tail (gensym (concatenate 'string
297 (push `(,n-tail
(last ,n-value
)) binds
)
299 (push `(,name
(&rest args
)
300 (collect-list-expander ',n-value
',n-tail args
))
302 (push `(,name
(&rest args
)
303 (collect-normal-expander ',n-value
',kind args
))
305 `(macrolet ,macros
(let* ,(nreverse binds
) ,@body
))))
307 ;;;; some old-fashioned functions. (They're not just for old-fashioned
308 ;;;; code, they're also used as optimized forms of the corresponding
309 ;;;; general functions when the compiler can prove that they're
312 ;;; like (MEMBER ITEM LIST :TEST #'EQ)
313 (defun memq (item list
)
315 "Return tail of LIST beginning with first element EQ to ITEM."
316 ;; KLUDGE: These could be and probably should be defined as
317 ;; (MEMBER ITEM LIST :TEST #'EQ)),
318 ;; but when I try to cross-compile that, I get an error from
319 ;; LTN-ANALYZE-KNOWN-CALL, "Recursive known function definition". The
320 ;; comments for that error say it "is probably a botched interpreter stub".
321 ;; Rather than try to figure that out, I just rewrote this function from
322 ;; scratch. -- WHN 19990512
323 (do ((i list
(cdr i
)))
325 (when (eq (car i
) item
)
328 ;;; like (ASSOC ITEM ALIST :TEST #'EQ):
329 ;;; Return the first pair of ALIST where ITEM is EQ to the key of
331 (defun assq (item alist
)
332 ;; KLUDGE: CMU CL defined this with
333 ;; (DECLARE (INLINE ASSOC))
334 ;; (ASSOC ITEM ALIST :TEST #'EQ))
335 ;; which is pretty, but which would have required adding awkward
336 ;; build order constraints on SBCL (or figuring out some way to make
337 ;; inline definitions installable at build-the-cross-compiler time,
338 ;; which was too ambitious for now). Rather than mess with that, we
339 ;; just define ASSQ explicitly in terms of more primitive
342 ;; though it may look more natural to write this as
343 ;; (AND PAIR (EQ (CAR PAIR) ITEM))
344 ;; the temptation to do so should be resisted, as pointed out by PFD
345 ;; sbcl-devel 2003-08-16, as NIL elements are rare in association
346 ;; lists. -- CSR, 2003-08-16
347 (when (and (eq (car pair
) item
) (not (null pair
)))
350 ;;; like (DELETE .. :TEST #'EQ):
351 ;;; Delete all LIST entries EQ to ITEM (destructively modifying
352 ;;; LIST), and return the modified LIST.
353 (defun delq (item list
)
355 (do ((x list
(cdr x
))
358 (cond ((eq item
(car x
))
361 (rplacd splice
(cdr x
))))
362 (t (setq splice x
)))))) ; Move splice along to include element.
365 ;;; like (POSITION .. :TEST #'EQ):
366 ;;; Return the position of the first element EQ to ITEM.
367 (defun posq (item list
)
368 (do ((i list
(cdr i
))
371 (when (eq (car i
) item
)
374 (declaim (inline neq
))
378 ;;; not really an old-fashioned function, but what the calling
379 ;;; convention should've been: like NTH, but with the same argument
380 ;;; order as in all the other dereferencing functions, with the
381 ;;; collection first and the index second
382 (declaim (inline nth-but-with-sane-arg-order
))
383 (declaim (ftype (function (list index
) t
) nth-but-with-sane-arg-order
))
384 (defun nth-but-with-sane-arg-order (list index
)
387 (defun adjust-list (list length initial-element
)
388 (let ((old-length (length list
)))
389 (cond ((< old-length length
)
390 (append list
(make-list (- length old-length
)
391 :initial-element initial-element
)))
392 ((> old-length length
)
393 (subseq list
0 length
))
396 ;;;; miscellaneous iteration extensions
398 ;;; "the ultimate iteration macro"
400 ;;; note for Schemers: This seems to be identical to Scheme's "named LET".
401 (defmacro named-let
(name binds
&body body
)
404 (unless (proper-list-of-length-p x
2)
405 (error "malformed NAMED-LET variable spec: ~S" x
)))
406 `(labels ((,name
,(mapcar #'first binds
) ,@body
))
407 (,name
,@(mapcar #'second binds
))))
409 (defun filter-dolist-declarations (decls)
410 (mapcar (lambda (decl)
411 `(declare ,@(remove-if
414 (or (eq (car clause
) 'type
)
415 (eq (car clause
) 'ignore
))))
419 ;;; just like DOLIST, but with one-dimensional arrays
420 (defmacro dovector
((elt vector
&optional result
) &body body
)
421 (multiple-value-bind (forms decls
) (parse-body body
:doc-string-allowed nil
)
422 (with-unique-names (index length vec
)
423 `(let ((,vec
,vector
))
424 (declare (type vector
,vec
))
425 (do ((,index
0 (1+ ,index
))
426 (,length
(length ,vec
)))
427 ((>= ,index
,length
) (let ((,elt nil
))
428 ,@(filter-dolist-declarations decls
)
431 (let ((,elt
(aref ,vec
,index
)))
436 ;;; Iterate over the entries in a HASH-TABLE.
437 (defmacro dohash
((key-var value-var table
&optional result
) &body body
)
438 (multiple-value-bind (forms decls
) (parse-body body
:doc-string-allowed nil
)
441 `(with-hash-table-iterator (,gen
,table
)
443 (multiple-value-bind (,n-more
,key-var
,value-var
) (,gen
)
445 (unless ,n-more
(return ,result
))
448 ;;;; hash cache utility
450 (eval-when (:compile-toplevel
:load-toplevel
:execute
)
451 (defvar *profile-hash-cache
* nil
))
453 ;;; a flag for whether it's too early in cold init to use caches so
454 ;;; that we have a better chance of recovering so that we have a
455 ;;; better chance of getting the system running so that we have a
456 ;;; better chance of diagnosing the problem which caused us to use the
459 (defvar *hash-caches-initialized-p
*)
461 ;;; Define a hash cache that associates some number of argument values
462 ;;; with a result value. The TEST-FUNCTION paired with each ARG-NAME
463 ;;; is used to compare the value for that arg in a cache entry with a
464 ;;; supplied arg. The TEST-FUNCTION must not error when passed NIL as
465 ;;; its first arg, but need not return any particular value.
466 ;;; TEST-FUNCTION may be any thing that can be placed in CAR position.
468 ;;; This code used to store all the arguments / return values directly
469 ;;; in the cache vector. This was both interrupt- and thread-unsafe, since
470 ;;; it was possible that *-CACHE-ENTER would scribble over a region of the
471 ;;; cache vector which *-CACHE-LOOKUP had only partially processed. Instead
472 ;;; we now store the contents of each cache bucket as a separate array, which
473 ;;; is stored in the appropriate cell in the cache vector. A new bucket array
474 ;;; is created every time *-CACHE-ENTER is called, and the old ones are never
475 ;;; modified. This means that *-CACHE-LOOKUP will always work with a set
476 ;;; of consistent data. The overhead caused by consing new buckets seems to
477 ;;; be insignificant on the grand scale of things. -- JES, 2006-11-02
479 ;;; NAME is used to define these functions:
480 ;;; <name>-CACHE-LOOKUP Arg*
481 ;;; See whether there is an entry for the specified ARGs in the
482 ;;; cache. If not present, the :DEFAULT keyword (default NIL)
483 ;;; determines the result(s).
484 ;;; <name>-CACHE-ENTER Arg* Value*
485 ;;; Encache the association of the specified args with VALUE.
486 ;;; <name>-CACHE-CLEAR
487 ;;; Reinitialize the cache, invalidating all entries and allowing
488 ;;; the arguments and result values to be GC'd.
490 ;;; These other keywords are defined:
492 ;;; The size of the cache as a power of 2.
493 ;;; :HASH-FUNCTION function
494 ;;; Some thing that can be placed in CAR position which will compute
495 ;;; a value between 0 and (1- (expt 2 <hash-bits>)).
497 ;;; the number of return values cached for each function call
498 ;;; :INIT-WRAPPER <name>
499 ;;; The code for initializing the cache is wrapped in a form with
500 ;;; the specified name. (:INIT-WRAPPER is set to COLD-INIT-FORMS
501 ;;; in type system definitions so that caches will be created
502 ;;; before top level forms run.)
503 (defmacro define-hash-cache
(name args
&key hash-function hash-bits default
504 (init-wrapper 'progn
)
506 (let* ((var-name (symbolicate "*" name
"-CACHE-VECTOR*"))
507 (nargs (length args
))
508 (size (ash 1 hash-bits
))
509 (default-values (if (and (consp default
) (eq (car default
) 'values
))
512 (args-and-values (gensym))
513 (args-and-values-size (+ nargs values
))
517 (unless (= (length default-values
) values
)
518 (error "The number of default values ~S differs from :VALUES ~W."
530 (let ((name (gensym)))
532 (values-refs `(svref ,args-and-values
(+ ,nargs
,i
)))
533 (sets `(setf (svref ,args-and-values
(+ ,nargs
,i
)) ,name
))))
536 (unless (= (length arg
) 2)
537 (error "bad argument spec: ~S" arg
))
538 (let ((arg-name (first arg
))
541 (tests `(,test
(svref ,args-and-values
,n
) ,arg-name
))
542 (sets `(setf (svref ,args-and-values
,n
) ,arg-name
)))
545 (when *profile-hash-cache
*
546 (let ((n-probe (symbolicate "*" name
"-CACHE-PROBES*"))
547 (n-miss (symbolicate "*" name
"-CACHE-MISSES*")))
548 (inits `(setq ,n-probe
0))
549 (inits `(setq ,n-miss
0))
550 (forms `(defvar ,n-probe
))
551 (forms `(defvar ,n-miss
))
552 (forms `(declaim (fixnum ,n-miss
,n-probe
)))))
554 (let ((fun-name (symbolicate name
"-CACHE-LOOKUP")))
557 `(defun ,fun-name
,(arg-vars)
558 ,@(when *profile-hash-cache
*
559 `((incf ,(symbolicate "*" name
"-CACHE-PROBES*"))))
560 (let* ((,n-index
(,hash-function
,@(arg-vars)))
562 (,args-and-values
(svref ,n-cache
,n-index
)))
563 (cond ((and ,args-and-values
565 (values ,@(values-refs)))
567 ,@(when *profile-hash-cache
*
568 `((incf ,(symbolicate "*" name
"-CACHE-MISSES*"))))
571 (let ((fun-name (symbolicate name
"-CACHE-ENTER")))
574 `(defun ,fun-name
(,@(arg-vars) ,@(values-names))
575 (let ((,n-index
(,hash-function
,@(arg-vars)))
577 (,args-and-values
(make-array ,args-and-values-size
)))
579 (setf (svref ,n-cache
,n-index
) ,args-and-values
))
582 (let ((fun-name (symbolicate name
"-CACHE-CLEAR")))
585 (fill ,var-name nil
)))
586 (forms `(,fun-name
)))
588 (inits `(unless (boundp ',var-name
)
589 (setq ,var-name
(make-array ,size
:initial-element nil
))))
590 #!+sb-show
(inits `(setq *hash-caches-initialized-p
* t
))
594 (declaim (type (simple-vector ,size
) ,var-name
))
595 #!-sb-fluid
(declaim (inline ,@(inlines)))
596 (,init-wrapper
,@(inits))
600 ;;; some syntactic sugar for defining a function whose values are
601 ;;; cached by DEFINE-HASH-CACHE
602 (defmacro defun-cached
((name &rest options
&key
(values 1) default
604 args
&body body-decls-doc
)
605 (let ((default-values (if (and (consp default
) (eq (car default
) 'values
))
608 (arg-names (mapcar #'car args
)))
609 (collect ((values-names))
611 (values-names (gensym)))
612 (multiple-value-bind (body decls doc
) (parse-body body-decls-doc
)
614 (define-hash-cache ,name
,args
,@options
)
615 (defun ,name
,arg-names
619 ((not (boundp '*hash-caches-initialized-p
*))
620 ;; This shouldn't happen, but it did happen to me
621 ;; when revising the type system, and it's a lot
622 ;; easier to figure out what what's going on with
623 ;; that kind of problem if the system can be kept
624 ;; alive until cold boot is complete. The recovery
625 ;; mechanism should definitely be conditional on
626 ;; some debugging feature (e.g. SB-SHOW) because
627 ;; it's big, duplicating all the BODY code. -- WHN
628 (/show0
,name
" too early in cold init, uncached")
629 (/show0
,(first arg-names
) "=..")
630 (/hexstr
,(first arg-names
))
633 (multiple-value-bind ,(values-names)
634 (,(symbolicate name
"-CACHE-LOOKUP") ,@arg-names
)
635 (if (and ,@(mapcar (lambda (val def
)
637 (values-names) default-values
))
638 (multiple-value-bind ,(values-names)
640 (,(symbolicate name
"-CACHE-ENTER") ,@arg-names
642 (values ,@(values-names)))
643 (values ,@(values-names))))))))))))
645 (defmacro define-cached-synonym
646 (name &optional
(original (symbolicate "%" name
)))
647 (let ((cached-name (symbolicate "%%" name
"-CACHED")))
649 (defun-cached (,cached-name
:hash-bits
8
650 :hash-function
(lambda (x)
651 (logand (sxhash x
) #xff
)))
653 (apply #',original args
))
654 (defun ,name
(&rest args
)
655 (,cached-name args
)))))
657 ;;; FIXME: maybe not the best place
659 ;;; FIXME: think of a better name -- not only does this not have the
660 ;;; CAR recursion of EQUAL, it also doesn't have the special treatment
661 ;;; of pathnames, bit-vectors and strings.
663 ;;; KLUDGE: This means that we will no longer cache specifiers of the
664 ;;; form '(INTEGER (0) 4). This is probably not a disaster.
666 ;;; A helper function for the type system, which is the main user of
667 ;;; these caches: we must be more conservative than EQUAL for some of
668 ;;; our equality tests, because MEMBER and friends refer to EQLity.
670 (defun equal-but-no-car-recursion (x y
)
675 (eql (car x
) (car y
))
676 (equal-but-no-car-recursion (cdr x
) (cdr y
))))
681 ;;; Note: Almost always you want to use FIND-UNDELETED-PACKAGE-OR-LOSE
682 ;;; instead of this function. (The distinction only actually matters when
683 ;;; PACKAGE-DESIGNATOR is actually a deleted package, and in that case
684 ;;; you generally do want to signal an error instead of proceeding.)
685 (defun %find-package-or-lose
(package-designator)
686 (or (find-package package-designator
)
687 (error 'sb
!kernel
:simple-package-error
688 :package package-designator
689 :format-control
"The name ~S does not designate any package."
690 :format-arguments
(list package-designator
))))
692 ;;; ANSI specifies (in the section for FIND-PACKAGE) that the
693 ;;; consequences of most operations on deleted packages are
694 ;;; unspecified. We try to signal errors in such cases.
695 (defun find-undeleted-package-or-lose (package-designator)
696 (let ((maybe-result (%find-package-or-lose package-designator
)))
697 (if (package-name maybe-result
) ; if not deleted
699 (error 'sb
!kernel
:simple-package-error
700 :package maybe-result
701 :format-control
"The package ~S has been deleted."
702 :format-arguments
(list maybe-result
)))))
704 ;;;; various operations on names
706 ;;; Is NAME a legal function name?
707 (declaim (inline legal-fun-name-p
))
708 (defun legal-fun-name-p (name)
709 (values (valid-function-name-p name
)))
711 (deftype function-name
() '(satisfies legal-fun-name-p
))
713 ;;; Signal an error unless NAME is a legal function name.
714 (defun legal-fun-name-or-type-error (name)
715 (unless (legal-fun-name-p name
)
716 (error 'simple-type-error
718 :expected-type
'function-name
719 :format-control
"invalid function name: ~S"
720 :format-arguments
(list name
))))
722 ;;; Given a function name, return the symbol embedded in it.
724 ;;; The ordinary use for this operator (and the motivation for the
725 ;;; name of this operator) is to convert from a function name to the
726 ;;; name of the BLOCK which encloses its body.
728 ;;; Occasionally the operator is useful elsewhere, where the operator
729 ;;; name is less mnemonic. (Maybe it should be changed?)
730 (declaim (ftype (function ((or symbol cons
)) symbol
) fun-name-block-name
))
731 (defun fun-name-block-name (fun-name)
732 (cond ((symbolp fun-name
)
735 (multiple-value-bind (legalp block-name
)
736 (valid-function-name-p fun-name
)
739 (error "not legal as a function name: ~S" fun-name
))))
741 (error "not legal as a function name: ~S" fun-name
))))
743 (defun looks-like-name-of-special-var-p (x)
745 (let ((name (symbol-name x
)))
746 (and (> (length name
) 2) ; to exclude '* and '**
747 (char= #\
* (aref name
0))
748 (char= #\
* (aref name
(1- (length name
))))))))
750 ;;; Some symbols are defined by ANSI to be self-evaluating. Return
751 ;;; non-NIL for such symbols (and make the non-NIL value a traditional
752 ;;; message, for use in contexts where the user asks us to change such
754 (defun symbol-self-evaluating-p (symbol)
755 (declare (type symbol symbol
))
757 "Veritas aeterna. (can't change T)")
759 "Nihil ex nihil. (can't change NIL)")
761 "Keyword values can't be changed.")
765 ;;; This function is to be called just before a change which would
766 ;;; affect the symbol value. (We don't absolutely have to call this
767 ;;; function before such changes, since such changes are given as
768 ;;; undefined behavior. In particular, we don't if the runtime cost
769 ;;; would be annoying. But otherwise it's nice to do so.)
770 (defun about-to-modify-symbol-value (symbol)
771 (declare (type symbol symbol
))
772 (let ((reason (symbol-self-evaluating-p symbol
)))
775 ;; (Note: Just because a value is CONSTANTP is not a good enough
776 ;; reason to complain here, because we want DEFCONSTANT to be able
777 ;; to use this function, and it's legal to DEFCONSTANT a constant as
778 ;; long as the new value is EQL to the old value.)
782 ;;; If COLD-FSET occurs not at top level, just treat it as an ordinary
783 ;;; assignment instead of doing cold static linking. That way things like
784 ;;; (FLET ((FROB (X) ..))
785 ;;; (DEFUN FOO (X Y) (FROB X) ..)
786 ;;; (DEFUN BAR (Z) (AND (FROB X) ..)))
787 ;;; can still "work" for cold init: they don't do magical static
788 ;;; linking the way that true toplevel DEFUNs do, but at least they do
789 ;;; the linking eventually, so as long as #'FOO and #'BAR aren't
790 ;;; needed until "cold toplevel forms" have executed, it's OK.
791 (defmacro cold-fset
(name lambda
)
793 "~@<COLD-FSET ~S not cross-compiled at top level: demoting to ~
794 (SETF FDEFINITION)~:@>"
796 ;; We convert the LAMBDA expression to the corresponding NAMED-LAMBDA
797 ;; expression so that the compiler can use NAME in debug names etc.
798 (destructuring-bind (lambda-symbol &rest lambda-rest
) lambda
799 (assert (eql lambda-symbol
'lambda
)) ; else dunno how to do conversion
800 `(setf (fdefinition ',name
)
801 (named-lambda ,name
,@lambda-rest
))))
805 ;;;; "The macro ONCE-ONLY has been around for a long time on various
806 ;;;; systems [..] if you can understand how to write and when to use
807 ;;;; ONCE-ONLY, then you truly understand macro." -- Peter Norvig,
808 ;;;; _Paradigms of Artificial Intelligence Programming: Case Studies
809 ;;;; in Common Lisp_, p. 853
811 ;;; ONCE-ONLY is a utility useful in writing source transforms and
812 ;;; macros. It provides a concise way to wrap a LET around some code
813 ;;; to ensure that some forms are only evaluated once.
815 ;;; Create a LET* which evaluates each value expression, binding a
816 ;;; temporary variable to the result, and wrapping the LET* around the
817 ;;; result of the evaluation of BODY. Within the body, each VAR is
818 ;;; bound to the corresponding temporary variable.
819 (defmacro once-only
(specs &body body
)
820 (named-let frob
((specs specs
)
824 (let ((spec (first specs
)))
825 ;; FIXME: should just be DESTRUCTURING-BIND of SPEC
826 (unless (proper-list-of-length-p spec
2)
827 (error "malformed ONCE-ONLY binding spec: ~S" spec
))
828 (let* ((name (first spec
))
829 (exp-temp (gensym (symbol-name name
))))
830 `(let ((,exp-temp
,(second spec
))
831 (,name
(gensym "ONCE-ONLY-")))
832 `(let ((,,name
,,exp-temp
))
833 ,,(frob (rest specs
) body
))))))))
835 ;;;; various error-checking utilities
837 ;;; This function can be used as the default value for keyword
838 ;;; arguments that must be always be supplied. Since it is known by
839 ;;; the compiler to never return, it will avoid any compile-time type
840 ;;; warnings that would result from a default value inconsistent with
841 ;;; the declared type. When this function is called, it signals an
842 ;;; error indicating that a required &KEY argument was not supplied.
843 ;;; This function is also useful for DEFSTRUCT slot defaults
844 ;;; corresponding to required arguments.
845 (declaim (ftype (function () nil
) missing-arg
))
846 (defun missing-arg ()
848 (/show0
"entering MISSING-ARG")
849 (error "A required &KEY or &OPTIONAL argument was not supplied."))
851 ;;; like CL:ASSERT and CL:CHECK-TYPE, but lighter-weight
853 ;;; (As of sbcl-0.6.11.20, we were using some 400 calls to CL:ASSERT.
854 ;;; The CL:ASSERT restarts and whatnot expand into a significant
855 ;;; amount of code when you multiply them by 400, so replacing them
856 ;;; with this should reduce the size of the system by enough to be
857 ;;; worthwhile. ENFORCE-TYPE is much less common, but might still be
858 ;;; worthwhile, and since I don't really like CERROR stuff deep in the
859 ;;; guts of complex systems anyway, I replaced it too.)
860 (defmacro aver
(expr)
862 (%failed-aver
,(format nil
"~A" expr
))))
864 (defun %failed-aver
(expr-as-string)
865 ;; hackish way to tell we're in a cold sbcl and output the
866 ;; message before signallign error, as it may be this is too
867 ;; early in the cold init.
868 (when (find-package "SB!C")
870 (write-line "failed AVER:")
871 (write-line expr-as-string
)
873 (bug "~@<failed AVER: ~2I~_~S~:>" expr-as-string
))
875 (defun bug (format-control &rest format-arguments
)
877 :format-control format-control
878 :format-arguments format-arguments
))
880 (defmacro enforce-type
(value type
)
881 (once-only ((value value
))
882 `(unless (typep ,value
',type
)
883 (%failed-enforce-type
,value
',type
))))
885 (defun %failed-enforce-type
(value type
)
886 ;; maybe should be TYPE-BUG, subclass of BUG? If it is changed,
887 ;; check uses of it in user-facing code (e.g. WARN)
888 (error 'simple-type-error
891 :format-control
"~@<~S ~_is not a ~_~S~:>"
892 :format-arguments
(list value type
)))
894 ;;; Return a function like FUN, but expecting its (two) arguments in
895 ;;; the opposite order that FUN does.
896 (declaim (inline swapped-args-fun
))
897 (defun swapped-args-fun (fun)
898 (declare (type function fun
))
902 ;;; Return the numeric value of a type bound, i.e. an interval bound
903 ;;; more or less in the format of bounds in ANSI's type specifiers,
904 ;;; where a bare numeric value is a closed bound and a list of a
905 ;;; single numeric value is an open bound.
907 ;;; The "more or less" bit is that the no-bound-at-all case is
908 ;;; represented by NIL (not by * as in ANSI type specifiers); and in
909 ;;; this case we return NIL.
910 (defun type-bound-number (x)
912 (destructuring-bind (result) x result
)
915 ;;; some commonly-occuring CONSTANTLY forms
916 (macrolet ((def-constantly-fun (name constant-expr
)
917 `(setf (symbol-function ',name
)
918 (constantly ,constant-expr
))))
919 (def-constantly-fun constantly-t t
)
920 (def-constantly-fun constantly-nil nil
)
921 (def-constantly-fun constantly-0
0))
923 ;;; If X is an atom, see whether it is present in *FEATURES*. Also
924 ;;; handle arbitrary combinations of atoms using NOT, AND, OR.
930 (error "too many subexpressions in feature expression: ~S" x
)
931 (not (featurep (cadr x
)))))
932 ((:and and
) (every #'featurep
(cdr x
)))
933 ((:or or
) (some #'featurep
(cdr x
)))
935 (error "unknown operator in feature expression: ~S." x
)))
936 (not (null (memq x
*features
*)))))
938 ;;;; utilities for two-VALUES predicates
940 (defmacro not
/type
(x)
941 (let ((val (gensym "VAL"))
942 (win (gensym "WIN")))
943 `(multiple-value-bind (,val
,win
)
946 (values (not ,val
) t
)
949 (defmacro and
/type
(x y
)
950 `(multiple-value-bind (val1 win1
) ,x
951 (if (and (not val1
) win1
)
953 (multiple-value-bind (val2 win2
) ,y
956 (values nil
(and win2
(not val2
))))))))
958 ;;; sort of like ANY and EVERY, except:
959 ;;; * We handle two-VALUES predicate functions, as SUBTYPEP does.
960 ;;; (And if the result is uncertain, then we return (VALUES NIL NIL),
961 ;;; as SUBTYPEP does.)
962 ;;; * THING is just an atom, and we apply OP (an arity-2 function)
963 ;;; successively to THING and each element of LIST.
964 (defun any/type
(op thing list
)
965 (declare (type function op
))
967 (dolist (i list
(values nil certain?
))
968 (multiple-value-bind (sub-value sub-certain?
) (funcall op thing i
)
970 (when sub-value
(return (values t t
)))
971 (setf certain? nil
))))))
972 (defun every/type
(op thing list
)
973 (declare (type function op
))
975 (dolist (i list
(if certain?
(values t t
) (values nil nil
)))
976 (multiple-value-bind (sub-value sub-certain?
) (funcall op thing i
)
978 (unless sub-value
(return (values nil t
)))
979 (setf certain? nil
))))))
983 ;;; These functions are called by the expansion of the DEFPRINTER
984 ;;; macro to do the actual printing.
985 (declaim (ftype (function (symbol t stream
) (values))
986 defprinter-prin1 defprinter-princ
))
987 (defun defprinter-prin1 (name value stream
)
988 (defprinter-prinx #'prin1 name value stream
))
989 (defun defprinter-princ (name value stream
)
990 (defprinter-prinx #'princ name value stream
))
991 (defun defprinter-prinx (prinx name value stream
)
992 (declare (type function prinx
))
994 (pprint-newline :linear stream
))
995 (format stream
":~A " name
)
996 (funcall prinx value stream
)
998 (defun defprinter-print-space (stream)
999 (write-char #\space stream
))
1001 ;;; Define some kind of reasonable PRINT-OBJECT method for a
1002 ;;; STRUCTURE-OBJECT class.
1004 ;;; NAME is the name of the structure class, and CONC-NAME is the same
1005 ;;; as in DEFSTRUCT.
1007 ;;; The SLOT-DESCS describe how each slot should be printed. Each
1008 ;;; SLOT-DESC can be a slot name, indicating that the slot should
1009 ;;; simply be printed. A SLOT-DESC may also be a list of a slot name
1010 ;;; and other stuff. The other stuff is composed of keywords followed
1011 ;;; by expressions. The expressions are evaluated with the variable
1012 ;;; which is the slot name bound to the value of the slot. These
1013 ;;; keywords are defined:
1015 ;;; :PRIN1 Print the value of the expression instead of the slot value.
1016 ;;; :PRINC Like :PRIN1, only PRINC the value
1017 ;;; :TEST Only print something if the test is true.
1019 ;;; If no printing thing is specified then the slot value is printed
1022 ;;; The structure being printed is bound to STRUCTURE and the stream
1023 ;;; is bound to STREAM.
1024 (defmacro defprinter
((name
1026 (conc-name (concatenate 'simple-string
1033 (reversed-prints nil
)
1034 (stream (gensym "STREAM")))
1035 (flet ((sref (slot-name)
1036 `(,(symbolicate conc-name slot-name
) structure
)))
1037 (dolist (slot-desc slot-descs
)
1039 (setf maybe-print-space nil
1041 (setf maybe-print-space
`(defprinter-print-space ,stream
)))
1042 (cond ((atom slot-desc
)
1043 (push maybe-print-space reversed-prints
)
1044 (push `(defprinter-prin1 ',slot-desc
,(sref slot-desc
) ,stream
)
1047 (let ((sname (first slot-desc
))
1050 (do ((option (rest slot-desc
) (cddr option
)))
1052 (push `(let ((,sname
,(sref sname
)))
1057 ',sname
,sname
,stream
)))))
1059 (case (first option
)
1061 (stuff `(defprinter-prin1
1062 ',sname
,(second option
) ,stream
)))
1064 (stuff `(defprinter-princ
1065 ',sname
,(second option
) ,stream
)))
1066 (:test
(setq test
(second option
)))
1068 (error "bad option: ~S" (first option
)))))))))))
1069 `(def!method print-object
((structure ,name
) ,stream
)
1070 (pprint-logical-block (,stream nil
)
1071 (print-unreadable-object (structure
1074 :identity
,identity
)
1075 ,@(nreverse reversed-prints
))))))
1079 ;;; Given a pathname, return a corresponding physical pathname.
1080 (defun physicalize-pathname (possibly-logical-pathname)
1081 (if (typep possibly-logical-pathname
'logical-pathname
)
1082 (translate-logical-pathname possibly-logical-pathname
)
1083 possibly-logical-pathname
))
1085 (defun deprecation-warning (bad-name &optional good-name
)
1086 (warn "using deprecated ~S~@[, should use ~S instead~]"
1090 ;;; Anaphoric macros
1091 (defmacro awhen
(test &body body
)
1095 (defmacro acond
(&rest clauses
)
1098 (destructuring-bind ((test &body body
) &rest rest
) clauses
1099 (once-only ((test test
))
1101 (let ((it ,test
)) (declare (ignorable it
)),@body
)
1104 ;;; (binding* ({(names initial-value [flag])}*) body)
1105 ;;; FLAG may be NIL or :EXIT-IF-NULL
1107 ;;; This form unites LET*, MULTIPLE-VALUE-BIND and AWHEN.
1108 (defmacro binding
* ((&rest bindings
) &body body
)
1109 (let ((bindings (reverse bindings
)))
1110 (loop with form
= `(progn ,@body
)
1111 for binding in bindings
1112 do
(destructuring-bind (names initial-value
&optional flag
)
1114 (multiple-value-bind (names declarations
)
1117 (let ((name (gensym)))
1118 (values (list name
) `((declare (ignorable ,name
))))))
1120 (values (list names
) nil
))
1122 (collect ((new-names) (ignorable))
1123 (dolist (name names
)
1125 (setq name
(gensym))
1130 `((declare (ignorable ,@(ignorable)))))))))
1131 (setq form
`(multiple-value-bind ,names
1137 `(when ,(first names
) ,form
)))))))
1138 finally
(return form
))))
1140 ;;; Delayed evaluation
1141 (defmacro delay
(form)
1142 `(cons nil
(lambda () ,form
)))
1144 (defun force (promise)
1145 (cond ((not (consp promise
)) promise
)
1146 ((car promise
) (cdr promise
))
1147 (t (setf (car promise
) t
1148 (cdr promise
) (funcall (cdr promise
))))))
1150 (defun promise-ready-p (promise)
1151 (or (not (consp promise
))
1155 (defmacro with-rebound-io-syntax
(&body body
)
1156 `(%with-rebound-io-syntax
(lambda () ,@body
)))
1158 (defun %with-rebound-io-syntax
(function)
1159 (declare (type function function
))
1160 (let ((*package
* *package
*)
1161 (*print-array
* *print-array
*)
1162 (*print-base
* *print-base
*)
1163 (*print-case
* *print-case
*)
1164 (*print-circle
* *print-circle
*)
1165 (*print-escape
* *print-escape
*)
1166 (*print-gensym
* *print-gensym
*)
1167 (*print-length
* *print-length
*)
1168 (*print-level
* *print-level
*)
1169 (*print-lines
* *print-lines
*)
1170 (*print-miser-width
* *print-miser-width
*)
1171 (*print-pretty
* *print-pretty
*)
1172 (*print-radix
* *print-radix
*)
1173 (*print-readably
* *print-readably
*)
1174 (*print-right-margin
* *print-right-margin
*)
1175 (*read-base
* *read-base
*)
1176 (*read-default-float-format
* *read-default-float-format
*)
1177 (*read-eval
* *read-eval
*)
1178 (*read-suppress
* *read-suppress
*)
1179 (*readtable
* *readtable
*))
1180 (funcall function
)))
1182 ;;; Bind a few "potentially dangerous" printer control variables to
1183 ;;; safe values, respecting current values if possible.
1184 (defmacro with-sane-io-syntax
(&body forms
)
1185 `(call-with-sane-io-syntax (lambda () ,@forms
)))
1187 (defun call-with-sane-io-syntax (function)
1188 (declare (type function function
))
1189 (macrolet ((true (sym)
1190 `(and (boundp ',sym
) ,sym
)))
1191 (let ((*print-readably
* nil
)
1192 (*print-level
* (or (true *print-level
*) 6))
1193 (*print-length
* (or (true *print-length
*) 12)))
1194 (funcall function
))))
1196 ;;; Default evaluator mode (interpeter / compiler)
1198 (declaim (type (member :compile
#!+sb-eval
:interpret
) *evaluator-mode
*))
1199 (defparameter *evaluator-mode
* :compile
1201 "Toggle between different evaluator implementations. If set to :COMPILE,
1202 an implementation of EVAL that calls the compiler will be used. If set
1203 to :INTERPRET, an interpreter will be used.")
1205 ;;; Helper for making the DX closure allocation in macros expanding
1206 ;;; to CALL-WITH-FOO less ugly.
1208 ;;; This expands to something like
1210 ;;; (flet ((foo (...) <body-of-foo>))
1211 ;;; (declare (optimize stack-allocate-dynamic-extent))
1212 ;;; (flet ((foo (...)
1214 ;;; (declare (dynamic-extent #'foo))
1215 ;;; <body-of-dx-flet>)))
1217 ;;; The outer FLETs are inlined into the inner ones, and the inner ones
1218 ;;; are DX-allocated. The double-fletting is done to keep the bodies of
1219 ;;; the functions in an environment with correct policy: we don't want
1220 ;;; to force DX allocation in their bodies, which would be bad eg.
1222 (defmacro dx-flet
(functions &body forms
)
1223 (let ((names (mapcar #'car functions
)))
1226 (declare (optimize sb
!c
::stack-allocate-dynamic-extent
))
1229 (let ((args (cadr f
))
1231 (when (intersection args lambda-list-keywords
)
1232 ;; No fundamental reason not to support them, but we
1233 ;; don't currently need them here.
1234 (error "Non-required arguments not implemented for DX-FLET."))
1238 (declare (dynamic-extent ,@(mapcar (lambda (x) `(function ,x
)) names
)))
1241 ;;; Another similar one -- but actually touches the policy of the body,
1242 ;;; so take care with this one...
1243 (defmacro dx-let
(bindings &body forms
)
1246 (declare (optimize sb
!c
::stack-allocate-dynamic-extent
))
1248 (declare (dynamic-extent ,@(mapcar (lambda (bind)