3 ;;; Various handy utilities
5 ;;; (c) 2009 Straylight/Edgeware
8 ;;;----- Licensing notice ---------------------------------------------------
10 ;;; This file is part of the Sensble Object Design, an object system for C.
12 ;;; SOD is free software; you can redistribute it and/or modify
13 ;;; it under the terms of the GNU General Public License as published by
14 ;;; the Free Software Foundation; either version 2 of the License, or
15 ;;; (at your option) any later version.
17 ;;; SOD is distributed in the hope that it will be useful,
18 ;;; but WITHOUT ANY WARRANTY; without even the implied warranty of
19 ;;; MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
20 ;;; GNU General Public License for more details.
22 ;;; You should have received a copy of the GNU General Public License
23 ;;; along with SOD; if not, write to the Free Software Foundation,
24 ;;; Inc., 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA.
26 (cl:defpackage #:sod-utilities
29 ;; MOP from somewhere.
31 #+(or cmu clisp) #:mop
34 (cl:in-package #:sod-utilities)
36 ;;;--------------------------------------------------------------------------
39 (export 'with-gensyms)
40 (defmacro with-gensyms ((&rest binds) &body body)
41 "Evaluate BODY with variables bound to fresh symbols.
43 The BINDS are a list of entries (VAR [NAME]), and a singleton list can be
44 replaced by just a symbol; each VAR is bound to a fresh symbol generated
45 by (gensym NAME), where NAME defaults to the symbol-name of VAR."
46 `(let (,@(mapcar (lambda (bind)
47 (multiple-value-bind (var name)
49 (values bind (concatenate 'string
50 (symbol-name bind) "-"))
53 (name (concatenate 'string
54 (symbol-name var) "-")))
57 `(,var (gensym ,name))))
61 (eval-when (:compile-toplevel :load-toplevel :execute)
62 (defun strip-quote (form)
63 "If FORM looks like (quote FOO) for self-evaluating FOO, return FOO.
65 If FORM is a symbol whose constant value is `nil' then return `nil'.
66 Otherwise return FORM unchanged. This makes it easier to inspect constant
67 things. This is a utility for `once-only'."
69 (cond ((and (consp form)
70 (eq (car form) 'quote)
73 (let ((body (cadr form)))
74 (if (or (not (or (consp body) (symbolp body)))
75 (member body '(t nil))
79 ((and (symbolp form) (boundp form) (null (symbol-value form)))
85 (defmacro once-only (binds &body body)
86 "Macro helper for preventing repeated evaluation.
88 The syntax is actually hairier than shown:
90 once-only ( [[ :environment ENV ]] { VAR | (VAR [VALUE-FORM]) }* )
93 So, the BINDS are a list of entries (VAR [VALUE-FORM]); a singleton list
94 can be replaced by just a symbol VAR, and the VALUE-FORM defaults to VAR.
95 But before them you can have keyword arguments. Only one is defined so
96 far. See below for the crazy things that does.
98 The result of evaluating a ONCE-ONLY form is a form with the structure
100 (let ((#:GS1 VALUE-FORM1)
105 where STUFF is the value of the BODY forms, as an implicit progn, in an
106 environment with the VARs bound to the corresponding gensyms.
108 As additional magic, if any of the VALUE-FORMs is actually constant (as
109 determined by inspection, and aided by `constantp' if an :environment is
110 supplied, then no gensym is constructed for it, and the VAR is bound
111 directly to the constant form. Moreover, if the constant form looks like
112 (quote FOO) for a self-evaluating FOO then the outer layer of quoting is
115 ;; We need an extra layer of gensyms in our expansion: we'll want the
116 ;; expansion to examine the various VALUE-FORMs to find out whether they're
117 ;; constant without evaluating them repeatedly. This also helps with
118 ;; another problem: we explicitly encourage the rebinding of a VAR
119 ;; (probably a macro argument) to a gensym which will be bound to the value
120 ;; of the form previously held in VAR itself -- so the gensym and value
121 ;; form must exist at the same time and we need two distinct variables.
123 (with-gensyms ((envvar "ENV-") lets sym (bodyfunc "BODY-"))
126 ;; First things first: let's pick up the keywords.
128 (unless (and binds (keywordp (car binds)))
131 (:environment (setf env (pop binds)))))
133 ;; Now we'll investigate the bindings. Turn each one into a list (VAR
134 ;; VALUE-FORM TEMP) where TEMP is an appropriate gensym -- see the note
136 (let ((canon (mapcar (lambda (bind)
137 (multiple-value-bind (var form)
141 (var &optional (form var)) bind
144 (gensym (format nil "T-~A-"
145 (symbol-name var))))))
148 `(let* (,@(and env `((,envvar ,env)))
150 ,@(mapcar (lambda (bind)
151 (destructuring-bind (var form temp) bind
152 (declare (ignore var))
155 ,@(mapcar (lambda (bind)
156 (destructuring-bind (var form temp) bind
157 (declare (ignore form))
159 (cond ((constantp ,temp
160 ,@(and env `(,envvar)))
166 ,(concatenate 'string
169 (push (list ,sym ,temp) ,lets)
172 (flet ((,bodyfunc () ,@body))
174 `(let (,@(nreverse ,lets)) ,(,bodyfunc))
178 (defun parse-body (body &key (docp t) (declp t))
179 "Parse the BODY into a docstring, declarations and the body forms.
181 These are returned as three lists, so that they can be spliced into a
182 macro expansion easily. The declarations are consolidated into a single
183 `declare' form. If DOCP is nil then a docstring is not permitted; if
184 DECLP is nil, then declarations are not permitted."
188 (cond ((null body) (return))
189 ((and declp (consp (car body)) (eq (caar body) 'declare))
190 (setf decls (append decls (cdr (pop body)))))
191 ((and docp (stringp (car body)) (not doc) (cdr body))
192 (setf doc (pop body)))
194 (values (and doc (list doc))
195 (and decls (list (cons 'declare decls)))
198 ;;;--------------------------------------------------------------------------
202 (defstruct (loc (:predicate locp) (:constructor make-loc (reader writer)))
203 "Locative data type. See `locf' and `ref'."
204 (reader nil :type function)
205 (writer nil :type function))
208 (defmacro locf (place &environment env)
209 "Slightly cheesy locatives.
211 (locf PLACE) returns an object which, using the `ref' function, can be
212 used to read or set the value of PLACE. It's cheesy because it uses
213 closures rather than actually taking the address of something. Also,
214 unlike Zetalisp, we don't overload `car' to do our dirty work."
216 (valtmps valforms newtmps setform getform)
217 (get-setf-expansion place env)
218 `(let* (,@(mapcar #'list valtmps valforms))
219 (make-loc (lambda () ,getform)
220 (lambda (,@newtmps) ,setform)))))
223 (declaim (inline ref (setf ref)))
225 "Fetch the value referred to by a locative."
226 (funcall (loc-reader loc)))
227 (defun (setf ref) (new loc)
228 "Store a new value in the place referred to by a locative."
229 (funcall (loc-writer loc) new))
231 (export 'with-locatives)
232 (defmacro with-locatives (locs &body body)
233 "Evaluate BODY with implicit locatives.
235 LOCS is a list of items of the form (SYM [LOC-EXPR]), where SYM is a
236 symbol and LOC-EXPR evaluates to a locative. If LOC-EXPR is omitted, it
237 defaults to SYM. As an abbreviation for a common case, LOCS may be a
238 symbol instead of a list.
240 The BODY is evaluated in an environment where each SYM is a symbol macro
241 which expands to (ref LOC-EXPR) -- or, in fact, something similar which
242 doesn't break if LOC-EXPR has side-effects. Thus, references, including
243 `setf' forms, fetch or modify the thing referred to by the LOC-EXPR.
244 Useful for covering over where something uses a locative."
245 (setf locs (mapcar (lambda (item)
246 (cond ((atom item) (list item item))
247 ((null (cdr item)) (list (car item) (car item)))
249 (if (listp locs) locs (list locs))))
250 (let ((tt (mapcar (lambda (l) (declare (ignore l)) (gensym)) locs))
251 (ll (mapcar #'cadr locs))
252 (ss (mapcar #'car locs)))
253 `(let (,@(mapcar (lambda (tmp loc) `(,tmp ,loc)) tt ll))
254 (symbol-macrolet (,@(mapcar (lambda (sym tmp)
255 `(,sym (ref ,tmp))) ss tt))
258 ;;;--------------------------------------------------------------------------
264 (defmacro aif (cond cons &optional (alt nil altp))
265 "If COND is not nil, evaluate CONS with `it' bound to the value of COND.
267 Otherwise, if given, evaluate ALT; `it' isn't bound in ALT."
269 `(if ,cond (let ((it ,cond)) ,cons) ,@(and altp `(,alt)))))
272 (defmacro awhen (cond &body body)
273 "If COND, evaluate BODY as a progn with `it' bound to the value of COND."
274 `(let ((it ,cond)) (when it ,@body)))
277 (defmacro acond (&body clauses &environment env)
278 "Like COND, but with `it' bound to the value of the condition.
280 Each of the CLAUSES has the form (CONDITION FORM*); if a CONDITION is
281 non-nil then evaluate the FORMs with `it' bound to the non-nil value, and
282 return the value of the last FORM; if there are no FORMs, then return `it'
283 itself. If the CONDITION is nil then continue with the next clause; if
284 all clauses evaluate to nil then the result is nil."
285 (labels ((walk (clauses)
288 (once-only (:environment env (cond (caar clauses)))
289 (if (and (constantp cond)
290 (if (and (consp cond) (eq (car cond) 'quote))
294 (declare (ignorable it))
300 (declare (ignorable it))
303 ,(walk (cdr clauses))))))))
306 (export '(acase aecase atypecase aetypecase))
307 (defmacro acase (value &body clauses)
308 `(let ((it ,value)) (case it ,@clauses)))
309 (defmacro aecase (value &body clauses)
310 `(let ((it ,value)) (ecase it ,@clauses)))
311 (defmacro atypecase (value &body clauses)
312 `(let ((it ,value)) (typecase it ,@clauses)))
313 (defmacro aetypecase (value &body clauses)
314 `(let ((it ,value)) (etypecase it ,@clauses)))
317 (defmacro asetf (&rest places-and-values &environment env)
318 "Anaphoric update of places.
320 The PLACES-AND-VALUES are alternating PLACEs and VALUEs. Each VALUE is
321 evaluated with IT bound to the current value stored in the corresponding
323 `(progn ,@(loop for (place value) on places-and-values by #'cddr
324 collect (multiple-value-bind
325 (temps inits newtemps setform getform)
326 (get-setf-expansion place env)
327 `(let* (,@(mapcar #'list temps inits)
329 (multiple-value-bind ,newtemps ,value
332 ;;;--------------------------------------------------------------------------
333 ;;; MOP hacks (not terribly demanding).
335 (export 'instance-initargs)
336 (defgeneric instance-initargs (instance)
338 "Return a plausble list of initargs for INSTANCE.
340 The idea is that you can make a copy of INSTANCE by invoking
342 (apply #'make-instance (class-of INSTANCE)
343 (instance-initargs INSTANCE))
345 The default implementation works by inspecting the slot definitions and
346 extracting suitable initargs, so this will only succeed if enough slots
347 actually have initargs specified that `initialize-instance' can fill in
350 The list returned is freshly consed, and you can destroy it if you like.")
351 (:method ((instance standard-object))
352 (mapcan (lambda (slot)
353 (aif (slot-definition-initargs slot)
355 (slot-value instance (slot-definition-name slot)))
357 (class-slots (class-of instance)))))
359 (export '(copy-instance copy-instance-using-class))
360 (defgeneric copy-instance-using-class (class instance &rest initargs)
362 "Metaobject protocol hook for `copy-instance'.")
363 (:method ((class standard-class) instance &rest initargs)
364 (let ((copy (allocate-instance class)))
365 (dolist (slot (class-slots class))
366 (let ((name (slot-definition-name slot)))
367 (when (slot-boundp instance name)
368 (setf (slot-value copy name) (slot-value instance name)))))
369 (apply #'shared-initialize copy nil initargs))))
370 (defun copy-instance (object &rest initargs)
371 "Construct and return a copy of OBJECT.
373 The new object has the same class as OBJECT, and the same slot values
374 except where overridden by INITARGS."
375 (apply #'copy-instance-using-class (class-of object) object initargs))
377 (export '(generic-function-methods method-specializers
378 eql-specializer eql-specializer-object))
380 ;;;--------------------------------------------------------------------------
383 (export 'make-list-builder)
384 (defun make-list-builder (&optional initial)
385 "Return a simple list builder."
387 ;; The `builder' is just a cons cell whose cdr will be the list that's
388 ;; wanted. Effectively, then, we have a list that's one item longer than
389 ;; we actually want. The car of this extra initial cons cell is always the
390 ;; last cons in the list -- which is now well defined because there's
391 ;; always at least one.
393 (let ((builder (cons nil initial)))
394 (setf (car builder) (last builder))
398 (defun lbuild-add (builder item)
399 "Add an ITEM to the end of a list BUILDER."
400 (let ((new (cons item nil)))
401 (setf (cdar builder) new
405 (export 'lbuild-add-list)
406 (defun lbuild-add-list (builder list)
407 "Add a LIST to the end of a list BUILDER. The LIST will be clobbered."
409 (setf (cdar builder) list
410 (car builder) (last list)))
413 (export 'lbuild-list)
414 (defun lbuild-list (builder)
415 "Return the constructed list."
419 (defun mappend (function list &rest more-lists)
420 "Like a nondestructive MAPCAN.
422 Map FUNCTION over the the corresponding elements of LIST and MORE-LISTS,
423 and return the result of appending all of the resulting lists."
424 (reduce #'append (apply #'mapcar function list more-lists) :from-end t))
426 (export '(inconsistent-merge-error merge-error-candidates))
427 (define-condition inconsistent-merge-error (error)
428 ((candidates :initarg :candidates
429 :reader merge-error-candidates))
431 "Reports an inconsistency in the arguments passed to `merge-lists'.")
432 (:report (lambda (condition stream)
433 (format stream "Merge inconsistency: failed to decide among ~A."
434 (merge-error-candidates condition)))))
436 (export 'merge-lists)
437 (defun merge-lists (lists &key pick (test #'eql))
438 "Return a merge of the given LISTS.
440 The resulting list contains the items of the given LISTS, with duplicates
441 removed. The order of the resulting list is consistent with the orders of
442 the input LISTS in the sense that if A precedes B in some input list then
443 A will also precede B in the output list. If the lists aren't consistent
444 (e.g., some list contains A followed by B, and another contains B followed
445 by A) then an error of type `inconsistent-merge-error' is signalled.
447 Item equality is determined by TEST.
449 If there is an ambiguity at any point -- i.e., a choice between two or
450 more possible next items to emit -- then PICK is called to arbitrate.
451 PICK is called with two arguments: the list of candidate next items, and
452 the current output list. It should return one of the candidate items.
453 The order of the candidates in the list given to the PICK function
454 reflects their order in the input LISTS: item A will precede item B in the
455 candidates list if and only if an occurrence of A appears in an earlier
456 input list than any occurrence of item B. (This completely determines the
457 order of the candidates: it is not possible that two candidates appear in
458 the same input list would resolve the ambiguity between them.) If PICK is
459 omitted then the item chosen is the one appearing in the earliest of the
460 input lists: i.e., effectively, the default PICK function is
462 (lambda (candidates output-so-far)
463 (declare (ignore output-so-far))
466 The primary use of this function is in computing class precedence lists.
467 By building the input lists and selecting the PICK function appropriately,
468 a variety of different CPL algorithms can be implemented."
470 (do ((lb (make-list-builder)))
471 ((null lists) (lbuild-list lb))
473 ;; The candidate items are the ones at the front of the input lists.
474 ;; Gather them up, removing duplicates. If a candidate is somewhere in
475 ;; one of the other lists other than at the front then we reject it. If
476 ;; we've just rejected everything, then we can make no more progress and
477 ;; the input lists were inconsistent.
478 (let* ((candidates (delete-duplicates (mapcar #'car lists)
479 :test test :from-end t))
480 (leasts (remove-if (lambda (item)
482 (member item (cdr list) :test test))
485 (winner (cond ((null leasts)
486 (error 'inconsistent-merge-error
487 :candidates candidates))
491 (funcall pick leasts (lbuild-list lb)))
494 ;; Check that the PICK function isn't conning us.
495 (assert (member winner leasts :test test))
497 ;; Update the output list and remove the winning item from the input
498 ;; lists. We know that it must be at the front of each input list
499 ;; containing it. At this point, we discard input lists entirely when
500 ;; they run out of entries. The loop ends when there are no more input
501 ;; lists left, i.e., when we've munched all of the input items.
502 (lbuild-add lb winner)
503 (setf lists (delete nil (mapcar (lambda (list)
504 (if (funcall test winner (car list))
510 (defmacro categorize ((itemvar items &key bind) categories &body body)
511 "Categorize ITEMS into lists and invoke BODY.
513 The ITEMVAR is a symbol; as the macro iterates over the ITEMS, ITEMVAR
514 will contain the current item. The BIND argument is a list of LET*-like
515 clauses. The CATEGORIES are a list of clauses of the form (SYMBOL
518 The behaviour of the macro is as follows. ITEMVAR is assigned (not
519 bound), in turn, each item in the list ITEMS. The PREDICATEs in the
520 CATEGORIES list are evaluated in turn, in an environment containing
521 ITEMVAR and the BINDings, until one of them evaluates to a non-nil value.
522 At this point, the item is assigned to the category named by the
523 corresponding SYMBOL. If none of the PREDICATEs returns non-nil then an
524 error is signalled; a PREDICATE consisting only of T will (of course)
525 match anything; it is detected specially so as to avoid compiler warnings.
527 Once all of the ITEMS have been categorized in this fashion, the BODY is
528 evaluated as an implicit PROGN. For each SYMBOL naming a category, a
529 variable named after that symbol will be bound in the BODY's environment
530 to a list of the items in that category, in the same order in which they
531 were found in the list ITEMS. The final values of the macro are the final
534 (let* ((cat-names (mapcar #'car categories))
535 (cat-match-forms (mapcar #'cadr categories))
536 (cat-vars (mapcar (lambda (name) (gensym (concatenate 'string
537 (symbol-name name) "-")))
539 (items-var (gensym "ITEMS-")))
540 `(let ((,items-var ,items)
541 ,@(mapcar (lambda (cat-var) (list cat-var nil)) cat-vars))
542 (dolist (,itemvar ,items-var)
544 (cond ,@(mapcar (lambda (cat-match-form cat-var)
546 (push ,itemvar ,cat-var)))
547 cat-match-forms cat-vars)
548 ,@(and (not (member t cat-match-forms))
549 `((t (error "Failed to categorize ~A" ,itemvar)))))))
550 (let ,(mapcar (lambda (name var)
551 `(,name (nreverse ,var)))
555 ;;;--------------------------------------------------------------------------
556 ;;; Strings and characters.
558 (export 'frob-identifier)
559 (defun frob-identifier (string &key (swap-case t) (swap-hyphen t))
560 "Twiddles the case of STRING.
562 If all the letters in STRING are uppercase, and SWAP-CASE is true, then
563 switch them to lowercase; if they're all lowercase then switch them to
564 uppercase. If there's a mix then leave them all alone. At the same time,
565 if there are underscores but no hyphens, and SWAP-HYPHEN is true, then
566 switch them to hyphens, if there are hyphens and no underscores, switch
567 them underscores, and if there are both then leave them alone.
569 This is an invertible transformation, which turns vaguely plausible Lisp
570 names into vaguely plausible C names and vice versa. Lisp names with
571 `funny characters' like stars and percent signs won't be any use, of
574 ;; Work out what kind of a job we've got to do. Gather flags: bit 0 means
575 ;; there are upper-case letters; bit 1 means there are lower-case letters;
576 ;; bit 2 means there are hyphens; bit 3 means there are underscores.
578 ;; Consequently, (logxor flags (ash flags 1)) is interesting: bit 1 is set
579 ;; if we have to frob case; bit 3 is set if we have to swap hyphens and
580 ;; underscores. So use this to select functions which do bits of the
581 ;; mapping, and then compose them together.
582 (let* ((flags (reduce (lambda (state ch)
584 (cond ((upper-case-p ch) 1)
585 ((lower-case-p ch) 2)
591 (mask (logxor flags (ash flags 1)))
592 (letter (cond ((or (not swap-case) (not (logbitp 1 mask)))
596 (and (alpha-char-p ch) (char-downcase ch))))
599 (and (alpha-char-p ch) (char-upcase ch))))))
600 (uscore-hyphen (cond ((or (not (logbitp 3 mask)) (not swap-hyphen))
603 (lambda (ch) (and (char= ch #\-) #\_)))
605 (lambda (ch) (and (char= ch #\_) #\-))))))
607 (if (logbitp 3 (logior mask (ash mask 2)))
608 (map 'string (lambda (ch)
609 (or (funcall letter ch)
610 (funcall uscore-hyphen ch)
615 (export 'whitespace-char-p)
616 (declaim (inline whitespace-char-p))
617 (defun whitespace-char-p (char)
618 "Returns whether CHAR is a whitespace character.
620 Whitespaceness is determined relative to the compile-time readtable, which
621 is probably good enough for most purposes."
623 (#.(loop for i below char-code-limit
624 for ch = (code-char i)
625 unless (with-input-from-string (in (string ch))
626 (peek-char t in nil))
630 (export 'update-position)
631 (declaim (inline update-position))
632 (defun update-position (char line column)
633 "Updates LINE and COLUMN appropriately for having read the character CHAR.
635 Returns the new LINE and COLUMN numbers."
637 ((#\newline #\vt #\page)
638 (values (1+ line) 0))
640 (values line (logandc2 (+ column 8) 7)))
642 (values line (1+ column)))))
644 (export 'backtrack-position)
645 (declaim (inline backtrack-position))
646 (defun backtrack-position (char line column)
647 "Updates LINE and COLUMN appropriately for having unread CHAR.
649 Well, actually an approximation for it; it will likely be wrong if the
650 last character was a tab. But when the character is read again, it will
653 ;; This isn't perfect: if the character doesn't actually match what was
654 ;; really read then it might not actually be possible: for example, if we
655 ;; push back a newline while in the middle of a line, or a tab while not at
656 ;; a tab stop. In that case, we'll just lose, but hopefully not too badly.
659 ;; In the absence of better ideas, I'll set the column number to zero.
660 ;; This is almost certainly wrong, but with a little luck nobody will ask
661 ;; and it'll be all right soon.
662 ((#\newline #\vt #\page) (values (1- line) 0))
664 ;; Winding back a single space is sufficient. If the position is
665 ;; currently on a tab stop then it'll advance back here next time. If
666 ;; not, we're going to lose anyway because the previous character
667 ;; certainly couldn't have been a tab.
668 (#\tab (values line (1- column)))
670 ;; Anything else: just decrement the column and cross fingers.
671 (t (values line (1- column)))))
673 ;;;--------------------------------------------------------------------------
677 (defun compose (function &rest more-functions)
678 "Composition of functions. Functions are applied left-to-right.
680 This is the reverse order of the usual mathematical notation, but I find
681 it easier to read. It's also slightly easier to work with in programs.
682 That is, (compose F1 F2 ... Fn) is what a category theorist might write as
683 F1 ; F2 ; ... ; Fn, rather than F1 o F2 o ... o Fn."
685 (labels ((compose1 (func-a func-b)
687 (multiple-value-call func-b (apply func-a args)))))
688 (reduce #'compose1 more-functions :initial-value function)))
690 ;;;--------------------------------------------------------------------------
693 (export 'symbolicate)
694 (defun symbolicate (&rest symbols)
695 "Return a symbol named after the concatenation of the names of the SYMBOLS.
697 The symbol is interned in the current `*package*'. Trad."
698 (intern (apply #'concatenate 'string (mapcar #'symbol-name symbols))))
700 ;;;--------------------------------------------------------------------------
703 (export 'maybe-print-unreadable-object)
704 (defmacro maybe-print-unreadable-object
705 ((object stream &rest args) &body body)
706 "Print helper for usually-unreadable objects.
708 If `*print-escape*' is set then print OBJECT unreadably using BODY.
709 Otherwise just print using BODY."
710 (with-gensyms (print)
711 `(flet ((,print () ,@body))
713 (print-unreadable-object (,object ,stream ,@args)
717 ;;;--------------------------------------------------------------------------
718 ;;; Iteration macros.
721 (defmacro dosequence ((var seq &key (start 0) (end nil) indexvar)
724 "Macro for iterating over general sequences.
726 Iterates over a (sub)sequence SEQ, delimited by START and END (which are
727 evaluated). For each item of SEQ, BODY is invoked with VAR bound to the
728 item, and INDEXVAR (if requested) bound to the item's index. (Note that
729 this is different from most iteration constructs in Common Lisp, which
730 work by mutating the variable.)
732 The loop is surrounded by an anonymous BLOCK and the loop body forms an
733 implicit TAGBODY, as is usual. There is no result-form, however."
735 (once-only (:environment env seq start end)
736 (with-gensyms ((ivar "INDEX-") (endvar "END-") (bodyfunc "BODY-"))
737 (multiple-value-bind (docs decls body) (parse-body body :docp nil)
738 (declare (ignore docs))
740 (flet ((loopguts (indexp listp endvar)
741 ;; Build a DO-loop to do what we want.
743 (end-condition (if endvar
749 (body-call `(,bodyfunc ,item)))
751 (push `(,seq (nthcdr ,start ,seq) (cdr ,seq))
754 (push `(,ivar ,start (1+ ,ivar)) do-vars))
756 (setf body-call (append body-call (list ivar))))
757 `(do ,do-vars (,end-condition) ,body-call))))
760 (flet ((,bodyfunc (,var ,@(and indexvar `(,indexvar)))
765 (let ((,endvar (or ,end (length ,seq))))
766 ,(loopguts t nil endvar)))
770 ,(loopguts indexvar t nil)))))))))))
772 ;;;--------------------------------------------------------------------------
773 ;;; Structure accessor hacks.
775 (export 'define-access-wrapper)
776 (defmacro define-access-wrapper (from to &key read-only)
777 "Make (FROM THING) work like (TO THING).
779 If not READ-ONLY, then also make (setf (FROM THING) VALUE) work like
780 (setf (TO THING) VALUE).
782 This is mostly useful for structure slot accessors where the slot has to
783 be given an unpleasant name to avoid it being an external symbol."
785 (declaim (inline ,from ,@(and (not read-only) `((setf ,from)))))
786 (defun ,from (object)
788 ,@(and (not read-only)
789 `((defun (setf ,from) (value object)
790 (setf (,to object) value))))))
792 ;;;--------------------------------------------------------------------------
795 (export 'default-slot)
796 (defmacro default-slot ((instance slot &optional (slot-names t))
799 "If INSTANCE's slot named SLOT is unbound, set it to VALUE.
801 Only set SLOT if it's listed in SLOT-NAMES, or SLOT-NAMES is `t' (i.e., we
802 obey the `shared-initialize' protocol). SLOT-NAMES defaults to `t', so
803 you can use it in `initialize-instance' or similar without ill effects.
804 Both INSTANCE and SLOT are evaluated; VALUE is an implicit progn and only
805 evaluated if it's needed."
807 (once-only (:environment env instance slot slot-names)
808 `(when ,(if (eq slot-names t)
809 `(not (slot-boundp ,instance ,slot))
810 `(and (not (slot-boundp ,instance ,slot))
811 (or (eq ,slot-names t)
812 (member ,slot ,slot-names))))
813 (setf (slot-value ,instance ,slot)
816 (export 'define-on-demand-slot)
817 (defmacro define-on-demand-slot (class slot (instance) &body body)
818 "Defines a slot which computes its initial value on demand.
820 Sets up the named SLOT of CLASS to establish its value as the implicit
821 progn BODY, by defining an appropriate method on `slot-unbound'."
822 (multiple-value-bind (docs decls body) (parse-body body)
823 (with-gensyms (classvar slotvar)
824 `(defmethod slot-unbound
825 (,classvar (,instance ,class) (,slotvar (eql ',slot)))
827 (declare (ignore ,classvar))
828 (setf (slot-value ,instance ',slot) (progn ,@body))))))
830 ;;;----- That's all, folks --------------------------------------------------