1 ;;;; a simple code walker
3 ;;;; The code which implements the macroexpansion environment
4 ;;;; manipulation mechanisms is in the first part of the file, the
5 ;;;; real walker follows it.
7 ;;;; This software is part of the SBCL system. See the README file for
10 ;;;; This software is derived from software originally released by Xerox
11 ;;;; Corporation. Copyright and release statements follow. Later modifications
12 ;;;; to the software are in the public domain and are provided with
13 ;;;; absolutely no warranty. See the COPYING and CREDITS files for more
16 ;;;; copyright information from original PCL sources:
18 ;;;; Copyright (c) 1985, 1986, 1987, 1988, 1989, 1990 Xerox Corporation.
19 ;;;; All rights reserved.
21 ;;;; Use and copying of this software and preparation of derivative works based
22 ;;;; upon this software are permitted. Any distribution of this software or
23 ;;;; derivative works must comply with all applicable United States export
26 ;;;; This software is made available AS IS, and Xerox Corporation makes no
27 ;;;; warranty about the software, its performance or its conformity to any
30 (in-package "SB!WALKER")
32 ;;;; forward references
34 (defvar *key-to-walker-environment*)
36 ;;;; environment hacking stuff, necessarily SBCL-specific
38 ;;; Here in the original PCL were implementations of the
39 ;;; implementation-specific environment hacking functions for each of
40 ;;; the implementations this walker had been ported to. This
41 ;;; functionality was originally factored out in order to make PCL
42 ;;; portable from one Common Lisp to another. As of 19981107, that
43 ;;; portability was fairly stale and (because of the scarcity of CLTL1
44 ;;; implementations and the strong interdependence of the rest of ANSI
45 ;;; Common Lisp on the CLOS system) fairly irrelevant. It was fairly
46 ;;; thoroughly put out of its misery by WHN in his quest to clean up
47 ;;; the system enough that it can be built from scratch using any ANSI
50 ;;; This code just hacks 'macroexpansion environments'. That is, it is
51 ;;; only concerned with the function binding of symbols in the
52 ;;; environment. The walker needs to be able to tell if the symbol
53 ;;; names a lexical macro or function, and it needs to be able to
54 ;;; build environments which contain lexical macro or function
55 ;;; bindings. It must be able, when walking a MACROLET, FLET or LABELS
56 ;;; form to construct an environment which reflects the bindings
57 ;;; created by that form. Note that the environment created does NOT
58 ;;; have to be sufficient to evaluate the body, merely to walk its
59 ;;; body. This means that definitions do not have to be supplied for
60 ;;; lexical functions, only the fact that that function is bound is
61 ;;; important. For macros, the macroexpansion function must be
64 ;;; This code is organized in a way that lets it work in
65 ;;; implementations that stack cons their environments. That is
66 ;;; reflected in the fact that the only operation that lets a user
67 ;;; build a new environment is a WITH-BODY macro which executes its
68 ;;; body with the specified symbol bound to the new environment. No
69 ;;; code in this walker or in PCL will hold a pointer to these
70 ;;; environments after the body returns. Other user code is free to do
71 ;;; so in implementations where it works, but that code is not
72 ;;; considered portable.
74 ;;; There are 3 environment hacking tools. One macro,
75 ;;; WITH-AUGMENTED-ENVIRONMENT, which is used to create new
76 ;;; environments, and two functions, ENVIRONMENT-FUNCTION and
77 ;;; ENVIRONMENT-MACRO, which are used to access the bindings of
78 ;;; existing environments
80 ;;; In SBCL, as in CMU CL before it, the environment is represented
81 ;;; with a structure that holds alists for the functional things,
82 ;;; variables, blocks, etc. Except for SYMBOL-MACROLET, only the
83 ;;; SB!C::LEXENV-FUNS slot is relevant. It holds: Alist (Name . What),
84 ;;; where What is either a functional (a local function) or a list
85 ;;; (MACRO . <function>) (a local macro, with the specifier expander.)
86 ;;; Note that Name may be a (SETF <name>) function. Accessors are
87 ;;; defined below, eg (ENV-WALK-FUNCTION ENV).
89 ;;; If WITH-AUGMENTED-ENVIRONMENT is called from WALKER-ENVIRONMENT-BIND
90 ;;; this code hides the WALKER version of an environment
91 ;;; inside the SB!C::LEXENV structure.
93 ;;; In CMUCL (and former SBCL), This used to be a list of lists of form
94 ;;; (<gensym-name> MACRO . #<interpreted-function>) in the :functions slot
96 ;;; This form was accepted by the compiler, but this was a crude hack,
97 ;;; because the <interpreted-function> was used as a structure to hold the
98 ;;; bits of interest, {function, form, declarations, lexical-variables},
99 ;;; a list, which was not really an interpreted function.
100 ;;; Instead this list was COERCEd to a #<FUNCTION ...>!
102 ;;; Instead, we now use a special sort of "function"-type for that
103 ;;; information, because the functions slot in SB!C::LEXENV is
104 ;;; supposed to have a list of <Name MACRO . #<function> elements.
105 ;;; So, now we hide our bits of interest in the walker-info slot in
106 ;;; our new BOGO-FUN.
108 ;;; MACROEXPAND-1 and SB!INT:EVAL-IN-LEXENV are the only SBCL
109 ;;; functions that get called with the constructed environment
112 (/show "walk.lisp 108")
114 (defmacro with-augmented-environment
115 ((new-env old-env &key functions macros) &body body)
116 `(let ((,new-env (with-augmented-environment-internal ,old-env
121 ;;; a unique tag to show that we're the intended caller of BOGO-FUN
122 (defvar *bogo-fun-magic-tag*
123 '(:bogo-fun-magic-tag))
125 ;;; The interface of BOGO-FUNs (previously implemented as
126 ;;; FUNCALLABLE-INSTANCEs) is just these two operations, so we can do
127 ;;; them with ordinary closures.
129 ;;; KLUDGE: BOGO-FUNs are sorta weird, and MNA and I have both hacked
130 ;;; on this code without quite figuring out what they're for. (He
131 ;;; changed them to work after some changes in the IR1 interpreter
132 ;;; made functions not be built lazily, and I changed them so that
133 ;;; they don't need FUNCALLABLE-INSTANCE stuff, so that the F-I stuff
134 ;;; can become less general.) There may be further simplifications or
135 ;;; clarifications which could be done. -- WHN 2001-10-19
136 (defun walker-info-to-bogo-fun (walker-info)
137 (lambda (magic-tag &rest rest)
138 (aver (not rest)) ; else someone is using me in an unexpected way
139 (aver (eql magic-tag *bogo-fun-magic-tag*)) ; else ditto
141 (defun bogo-fun-to-walker-info (bogo-fun)
142 (declare (type function bogo-fun))
143 (funcall bogo-fun *bogo-fun-magic-tag*))
145 (defun with-augmented-environment-internal (env funs macros)
146 ;; Note: In order to record the correct function definition, we
147 ;; would have to create an interpreted closure, but the
148 ;; WITH-NEW-DEFINITION macro down below makes no distinction between
149 ;; FLET and LABELS, so we have no idea what to use for the
150 ;; environment. So we just blow it off, 'cause anything real we do
151 ;; would be wrong. But we still have to make an entry so we can tell
152 ;; functions from macros.
153 (let ((lexenv (sb!kernel::coerce-to-lexenv env)))
156 :vars (when (eql (caar macros) *key-to-walker-environment*)
157 (copy-tree (remove :lexical-var (fourth (cadar macros))
159 :funs (append (mapcar (lambda (f)
161 (sb!c::make-functional :lexenv lexenv)))
167 *key-to-walker-environment*)
168 (walker-info-to-bogo-fun (cadr m))
169 (coerce (cadr m) 'function))))
172 (defun environment-function (env fn)
174 (let ((entry (assoc fn (sb!c::lexenv-funs env) :test #'equal)))
176 (sb!c::functional-p (cdr entry))
179 (defun environment-macro (env macro)
181 (let ((entry (assoc macro (sb!c::lexenv-funs env) :test #'eq)))
183 (eq (cadr entry) 'sb!c::macro)
184 (if (eq macro *key-to-walker-environment*)
185 (values (bogo-fun-to-walker-info (cddr entry)))
186 (values (function-lambda-expression (cddr entry))))))))
188 ;;;; other environment hacking, not so SBCL-specific as the
189 ;;;; environment hacking in the previous section
191 (defmacro with-new-definition-in-environment
192 ((new-env old-env macrolet/flet/labels-form) &body body)
193 (let ((functions (make-symbol "Functions"))
194 (macros (make-symbol "Macros")))
195 `(let ((,functions ())
197 (ecase (car ,macrolet/flet/labels-form)
199 (dolist (fn (cadr ,macrolet/flet/labels-form))
200 (push fn ,functions)))
202 (dolist (mac (cadr ,macrolet/flet/labels-form))
203 (push (list (car mac)
204 (convert-macro-to-lambda (cadr mac)
209 (with-augmented-environment
210 (,new-env ,old-env :functions ,functions :macros ,macros)
213 (defun convert-macro-to-lambda (llist body env &optional (name "dummy macro"))
214 (let ((gensym (make-symbol name)))
215 (eval-in-lexenv `(defmacro ,gensym ,llist ,@body)
216 (sb!c::make-restricted-lexenv env))
217 (macro-function gensym)))
219 ;;;; the actual walker
221 ;;; As the walker walks over the code, it communicates information to
222 ;;; itself about the walk. This information includes the walk
223 ;;; function, variable bindings, declarations in effect etc. This
224 ;;; information is inherently lexical, so the walker passes it around
225 ;;; in the actual environment the walker passes to macroexpansion
226 ;;; functions. This is what makes the NESTED-WALK-FORM facility work
228 (defmacro walker-environment-bind ((var env &rest key-args)
230 `(with-augmented-environment
231 (,var ,env :macros (walker-environment-bind-1 ,env ,.key-args))
234 (defvar *key-to-walker-environment* (gensym))
236 (defun env-lock (env)
237 (environment-macro env *key-to-walker-environment*))
239 (defun walker-environment-bind-1 (env &key (walk-function nil wfnp)
241 (declarations nil decp)
242 (lexical-vars nil lexp))
243 (let ((lock (env-lock env)))
245 (list *key-to-walker-environment*
246 (list (if wfnp walk-function (car lock))
247 (if wfop walk-form (cadr lock))
248 (if decp declarations (caddr lock))
249 (if lexp lexical-vars (cadddr lock)))))))
251 (defun env-walk-function (env)
252 (car (env-lock env)))
254 (defun env-walk-form (env)
255 (cadr (env-lock env)))
257 (defun env-declarations (env)
258 (caddr (env-lock env)))
260 (defun env-lexical-variables (env)
261 (cadddr (env-lock env)))
263 (defun note-declaration (declaration env)
264 (push declaration (caddr (env-lock env))))
266 (defun note-lexical-binding (thing env)
267 (push (list thing :lexical-var) (cadddr (env-lock env))))
269 (defun var-lexical-p (var env)
270 (let ((entry (member var (env-lexical-variables env) :key #'car)))
271 (when (eq (cadar entry) :lexical-var)
274 (defun variable-symbol-macro-p (var env)
275 (let ((entry (member var (env-lexical-variables env) :key #'car)))
276 (when (eq (cadar entry) 'sb!sys:macro)
279 (defvar *var-declarations* '(special))
281 (defun var-declaration (declaration var env)
282 (if (not (member declaration *var-declarations*))
283 (error "~S is not a recognized variable declaration." declaration)
284 (let ((id (or (var-lexical-p var env) var)))
285 (dolist (decl (env-declarations env))
286 (when (and (eq (car decl) declaration)
290 (defun var-special-p (var env)
291 (or (not (null (var-declaration 'special var env)))
292 (var-globally-special-p var)))
294 (defun var-globally-special-p (symbol)
295 (eq (info :variable :kind symbol) :special))
298 ;;;; handling of special forms
300 ;;; Here are some comments from the original PCL on the difficulty of
301 ;;; doing this portably across different CLTL1 implementations. This
302 ;;; is no longer directly relevant because this code now only runs on
303 ;;; SBCL, but the comments are retained for culture: they might help
304 ;;; explain some of the design decisions which were made in the code.
308 ;;; The set of special forms is purposely kept very small because
309 ;;; any program analyzing program (read code walker) must have
310 ;;; special knowledge about every type of special form. Such a
311 ;;; program needs no special knowledge about macros...
313 ;;; So all we have to do here is a define a way to store and retrieve
314 ;;; templates which describe how to walk the 24 special forms and we
317 ;;; Well, its a nice concept, and I have to admit to being naive
318 ;;; enough that I believed it for a while, but not everyone takes
319 ;;; having only 24 special forms as seriously as might be nice. There
320 ;;; are (at least) 3 ways to lose:
322 ;;; 1 - Implementation x implements a Common Lisp special form as
323 ;;; a macro which expands into a special form which:
324 ;;; - Is a common lisp special form (not likely)
325 ;;; - Is not a common lisp special form (on the 3600 IF --> COND).
327 ;;; * We can save ourselves from this case (second subcase really)
328 ;;; by checking to see whether there is a template defined for
329 ;;; something before we check to see whether we can macroexpand it.
331 ;;; 2 - Implementation x implements a Common Lisp macro as a special form.
333 ;;; * This is a screw, but not so bad, we save ourselves from it by
334 ;;; defining extra templates for the macros which are *likely* to
335 ;;; be implemented as special forms. [Note: As of sbcl-0.6.9, these
336 ;;; extra templates have been deleted, since this is not a problem
337 ;;; in SBCL and we no longer try to make this walker portable
338 ;;; across other possibly-broken CL implementations.]
340 ;;; 3 - Implementation x has a special form which is not on the list of
341 ;;; Common Lisp special forms.
343 ;;; * This is a bad sort of a screw and happens more than I would
344 ;;; like to think, especially in the implementations which provide
345 ;;; more than just Common Lisp (3600, Xerox etc.).
346 ;;; The fix is not terribly satisfactory, but will have to do for
347 ;;; now. There is a hook in get walker-template which can get a
348 ;;; template from the implementation's own walker. That template
349 ;;; has to be converted, and so it may be that the right way to do
350 ;;; this would actually be for that implementation to provide an
351 ;;; interface to its walker which looks like the interface to this
354 (defmacro get-walker-template-internal (x)
355 `(get ,x 'walker-template))
357 (defmacro define-walker-template (name
358 &optional (template '(nil repeat (eval))))
359 `(eval-when (:load-toplevel :execute)
360 (setf (get-walker-template-internal ',name) ',template)))
362 (defun get-walker-template (x context)
364 (get-walker-template-internal x))
365 ((and (listp x) (eq (car x) 'lambda))
366 '(lambda repeat (eval)))
368 ;; FIXME: In an ideal world we would do something similar to
369 ;; COMPILER-ERROR here, replacing the form within the walker
370 ;; with an error-signalling form. This is slightly less
371 ;; pretty, but informative non the less. Best is the enemy of
373 (error "Illegal function call in method body:~% ~S"
376 ;;;; the actual templates
378 ;;; ANSI special forms
379 (define-walker-template block (nil nil repeat (eval)))
380 (define-walker-template catch (nil eval repeat (eval)))
381 (define-walker-template declare walk-unexpected-declare)
382 (define-walker-template eval-when (nil quote repeat (eval)))
383 (define-walker-template flet walk-flet)
384 (define-walker-template function (nil call))
385 (define-walker-template go (nil quote))
386 (define-walker-template if walk-if)
387 (define-walker-template labels walk-labels)
388 (define-walker-template lambda walk-lambda)
389 (define-walker-template let walk-let)
390 (define-walker-template let* walk-let*)
391 (define-walker-template locally walk-locally)
392 (define-walker-template macrolet walk-macrolet)
393 (define-walker-template multiple-value-call (nil eval repeat (eval)))
394 (define-walker-template multiple-value-prog1 (nil return repeat (eval)))
395 (define-walker-template multiple-value-setq walk-multiple-value-setq)
396 (define-walker-template multiple-value-bind walk-multiple-value-bind)
397 (define-walker-template progn (nil repeat (eval)))
398 (define-walker-template progv (nil eval eval repeat (eval)))
399 (define-walker-template quote (nil quote))
400 (define-walker-template return-from (nil quote repeat (return)))
401 (define-walker-template setq walk-setq)
402 (define-walker-template symbol-macrolet walk-symbol-macrolet)
403 (define-walker-template tagbody walk-tagbody)
404 (define-walker-template the (nil quote eval))
405 (define-walker-template throw (nil eval eval))
406 (define-walker-template unwind-protect (nil return repeat (eval)))
408 ;;; SBCL-only special forms
409 (define-walker-template sb!ext:truly-the (nil quote eval))
410 ;;; FIXME: maybe we don't need this one any more, given that
411 ;;; NAMED-LAMBDA now expands into (FUNCTION (NAMED-LAMBDA ...))?
412 (define-walker-template named-lambda walk-named-lambda)
414 (defvar *walk-form-expand-macros-p* nil)
416 (defun walk-form (form
417 &optional environment
419 (lambda (subform context env)
420 (declare (ignore context env))
422 (walker-environment-bind (new-env environment :walk-function walk-function)
423 (walk-form-internal form :eval new-env)))
425 ;;; WALK-FORM-INTERNAL is the main driving function for the code
426 ;;; walker. It takes a form and the current context and walks the form
427 ;;; calling itself or the appropriate template recursively.
429 ;;; "It is recommended that a program-analyzing-program process a form
430 ;;; that is a list whose car is a symbol as follows:
432 ;;; 1. If the program has particular knowledge about the symbol,
433 ;;; process the form using special-purpose code. All of the
434 ;;; standard special forms should fall into this category.
435 ;;; 2. Otherwise, if MACRO-FUNCTION is true of the symbol apply
436 ;;; either MACROEXPAND or MACROEXPAND-1 and start over.
437 ;;; 3. Otherwise, assume it is a function call. "
438 (defun walk-form-internal (form context env)
439 ;; First apply the walk-function to perform whatever translation
440 ;; the user wants to this form. If the second value returned
441 ;; by walk-function is T then we don't recurse...
443 (multiple-value-bind (newform walk-no-more-p)
444 (funcall (env-walk-function env) form context env)
447 (walk-no-more-p newform)
448 ((not (eq form newform))
449 (walk-form-internal newform context env))
450 ((not (consp newform))
451 (let ((symmac (car (variable-symbol-macro-p newform env))))
453 (let ((newnewform (walk-form-internal (cddr symmac)
456 (if (eq newnewform (cddr symmac))
457 (if *walk-form-expand-macros-p* newnewform newform)
461 (let* ((fn (car newform))
462 (template (get-walker-template fn newform)))
464 (if (symbolp template)
465 (funcall template newform context env)
466 (walk-template newform template context env))
467 (multiple-value-bind (newnewform macrop)
468 (walker-environment-bind
469 (new-env env :walk-form newform)
470 (sb-xc:macroexpand-1 newform new-env))
473 (let ((newnewnewform (walk-form-internal newnewform
476 (if (eq newnewnewform newnewform)
477 (if *walk-form-expand-macros-p* newnewform newform)
481 (special-operator-p fn))
482 ;; This shouldn't happen, since this walker is now
483 ;; maintained as part of SBCL, so it should know
484 ;; about all the special forms that SBCL knows
486 (bug "unexpected special form ~S" fn))
488 ;; Otherwise, walk the form as if it's just a
489 ;; standard function call using a template for
490 ;; standard function call.
492 newnewform '(call repeat (eval)) context env))))))))))))
494 (defun walk-template (form template context env)
497 ((eval function test effect return)
498 (walk-form-internal form :eval env))
501 (walk-form-internal form :set env))
503 (cond ((legal-fun-name-p form)
505 (t (walk-form-internal form context env)))))
508 (walk-template-handle-repeat form
510 ;; For the case where nothing
511 ;; happens after the repeat
512 ;; optimize away the call to
514 (if (null (cddr template))
516 (nthcdr (- (length form)
524 (if (if (listp (cadr template))
525 (eval (cadr template))
526 (funcall (cadr template) form))
532 (walk-template form (cadr template) context env))
534 (cond ((atom form) form)
537 (car form) (car template) context env)
539 (cdr form) (cdr template) context env))))))))
541 (defun walk-template-handle-repeat (form template stop-form context env)
542 (if (eq form stop-form)
543 (walk-template form (cdr template) context env)
544 (walk-template-handle-repeat-1
545 form template (car template) stop-form context env)))
547 (defun walk-template-handle-repeat-1 (form template repeat-template
548 stop-form context env)
549 (cond ((null form) ())
551 (if (null repeat-template)
552 (walk-template stop-form (cdr template) context env)
553 (error "while handling code walker REPEAT:
554 ~%ran into STOP while still in REPEAT template")))
555 ((null repeat-template)
556 (walk-template-handle-repeat-1
557 form template (car template) stop-form context env))
560 (walk-template (car form) (car repeat-template) context env)
561 (walk-template-handle-repeat-1 (cdr form)
563 (cdr repeat-template)
568 (defun walk-repeat-eval (form env)
571 (walk-form-internal (car form) :eval env)
572 (walk-repeat-eval (cdr form) env))))
574 (defun recons (x car cdr)
575 (if (or (not (eq (car x) car))
576 (not (eq (cdr x) cdr)))
580 (defun relist (x &rest args)
583 (relist-internal x args nil)))
585 (defun relist* (x &rest args)
586 (relist-internal x args t))
588 (defun relist-internal (x args *p)
589 (if (null (cdr args))
592 (recons x (car args) nil))
595 (relist-internal (cdr x) (cdr args) *p))))
599 (defun walk-declarations (body fn env
600 &optional doc-string-p declarations old-body
601 &aux (form (car body)) macrop new-form)
602 (cond ((and (stringp form) ;might be a doc string
603 (cdr body) ;isn't the returned value
604 (null doc-string-p) ;no doc string yet
605 (null declarations)) ;no declarations yet
608 (walk-declarations (cdr body) fn env t)))
609 ((and (listp form) (eq (car form) 'declare))
610 ;; We got ourselves a real live declaration. Record it, look
612 (dolist (declaration (cdr form))
613 (let ((type (car declaration))
614 (name (cadr declaration))
615 (args (cddr declaration)))
616 (if (member type *var-declarations*)
617 (note-declaration `(,type
618 ,(or (var-lexical-p name env) name)
621 (note-declaration declaration env))
622 (push declaration declarations)))
626 (cdr body) fn env doc-string-p declarations)))
629 (null (get-walker-template (car form) form))
631 (multiple-value-setq (new-form macrop)
632 (sb-xc:macroexpand-1 form env))
634 ;; This form was a call to a macro. Maybe it expanded
635 ;; into a declare? Recurse to find out.
636 (walk-declarations (recons body new-form (cdr body))
637 fn env doc-string-p declarations
640 ;; Now that we have walked and recorded the declarations,
641 ;; call the function our caller provided to expand the body.
642 ;; We call that function rather than passing the real-body
643 ;; back, because we are RECONSING up the new body.
644 (funcall fn (or old-body body) env))))
646 (defun walk-unexpected-declare (form context env)
647 (declare (ignore context env))
648 (warn "encountered ~S ~_in a place where a DECLARE was not expected"
652 (defun walk-arglist (arglist context env &optional (destructuringp nil)
654 (cond ((null arglist) ())
655 ((symbolp (setq arg (car arglist)))
656 (or (member arg lambda-list-keywords)
657 (note-lexical-binding arg env))
660 (walk-arglist (cdr arglist)
665 lambda-list-keywords))))))
667 (prog1 (recons arglist
669 (walk-arglist arg context env destructuringp)
672 (walk-form-internal (cadr arg) :eval env)
674 (walk-arglist (cdr arglist) context env nil))
675 (if (symbolp (car arg))
676 (note-lexical-binding (car arg) env)
677 (note-lexical-binding (cadar arg) env))
678 (or (null (cddr arg))
679 (not (symbolp (caddr arg)))
680 (note-lexical-binding (caddr arg) env))))
682 (error "can't understand something in the arglist ~S" arglist))))
684 (defun walk-let (form context env)
685 (walk-let/let* form context env nil))
687 (defun walk-let* (form context env)
688 (walk-let/let* form context env t))
690 (defun walk-let/let* (form context old-env sequentialp)
691 (walker-environment-bind (new-env old-env)
692 (let* ((let/let* (car form))
693 (bindings (cadr form))
696 (walk-bindings-1 bindings
702 (walk-declarations body #'walk-repeat-eval new-env)))
704 form let/let* walked-bindings walked-body))))
706 (defun walk-locally (form context old-env)
707 (declare (ignore context))
708 (walker-environment-bind (new-env old-env)
709 (let* ((locally (car form))
712 (walk-declarations body #'walk-repeat-eval new-env)))
714 form locally walked-body))))
716 (defun walk-multiple-value-setq (form context env)
717 (let ((vars (cadr form)))
718 (if (some (lambda (var)
719 (variable-symbol-macro-p var env))
721 (let* ((temps (mapcar (lambda (var)
722 (declare (ignore var))
725 (sets (mapcar (lambda (var temp) `(setq ,var ,temp))
728 (expanded `(multiple-value-bind ,temps ,(caddr form)
730 (walked (walk-form-internal expanded context env)))
731 (if (eq walked expanded)
734 (walk-template form '(nil (repeat (set)) eval) context env))))
736 (defun walk-multiple-value-bind (form context old-env)
737 (walker-environment-bind (new-env old-env)
738 (let* ((mvb (car form))
739 (bindings (cadr form))
740 (mv-form (walk-template (caddr form) 'eval context old-env))
746 (lambda (real-body real-env)
747 (setq walked-bindings
748 (walk-bindings-1 bindings
753 (walk-repeat-eval real-body real-env))
755 (relist* form mvb walked-bindings mv-form walked-body))))
757 (defun walk-bindings-1 (bindings old-env new-env context sequentialp)
759 (let ((binding (car bindings)))
761 (if (symbolp binding)
763 (note-lexical-binding binding new-env))
764 (prog1 (relist* binding
766 (walk-form-internal (cadr binding)
771 ;; Save cddr for DO/DO*; it is
772 ;; the next value form. Don't
773 ;; walk it now, though.
775 (note-lexical-binding (car binding) new-env)))
776 (walk-bindings-1 (cdr bindings)
782 (defun walk-bindings-2 (bindings walked-bindings context env)
784 (let ((binding (car bindings))
785 (walked-binding (car walked-bindings)))
787 (if (symbolp binding)
791 (cadr walked-binding)
792 (walk-template (cddr binding)
796 (walk-bindings-2 (cdr bindings)
797 (cdr walked-bindings)
801 (defun walk-lambda (form context old-env)
802 (walker-environment-bind (new-env old-env)
803 (let* ((arglist (cadr form))
805 (walked-arglist (walk-arglist arglist context new-env))
807 (walk-declarations body #'walk-repeat-eval new-env)))
813 (defun walk-named-lambda (form context old-env)
814 (walker-environment-bind (new-env old-env)
815 (let* ((name (second form))
816 (arglist (third form))
818 (walked-arglist (walk-arglist arglist context new-env))
820 (walk-declarations body #'walk-repeat-eval new-env)))
827 (defun walk-setq (form context env)
829 (let* ((expanded (let ((rforms nil)
831 (loop (when (null tail) (return (nreverse rforms)))
832 (let ((var (pop tail)) (val (pop tail)))
833 (push `(setq ,var ,val) rforms)))))
834 (walked (walk-repeat-eval expanded env)))
835 (if (eq expanded walked)
838 (let* ((var (cadr form))
840 (symmac (car (variable-symbol-macro-p var env))))
842 (let* ((expanded `(setf ,(cddr symmac) ,val))
843 (walked (walk-form-internal expanded context env)))
844 (if (eq expanded walked)
848 (walk-form-internal var :set env)
849 (walk-form-internal val :eval env))))))
851 (defun walk-symbol-macrolet (form context old-env)
852 (declare (ignore context))
853 (let* ((bindings (cadr form))
855 (walker-environment-bind
858 (append (mapcar (lambda (binding)
860 sb!sys:macro . ,(cadr binding)))
862 (env-lexical-variables old-env)))
863 (relist* form 'symbol-macrolet bindings
864 (walk-declarations body #'walk-repeat-eval new-env)))))
866 (defun walk-tagbody (form context env)
867 (recons form (car form) (walk-tagbody-1 (cdr form) context env)))
869 (defun walk-tagbody-1 (form context env)
872 (walk-form-internal (car form)
873 (if (symbolp (car form)) 'quote context)
875 (walk-tagbody-1 (cdr form) context env))))
877 (defun walk-macrolet (form context old-env)
878 (walker-environment-bind (old-env old-env)
879 (walker-environment-bind (macro-env
881 :walk-function (env-walk-function old-env))
882 (labels ((walk-definitions (definitions)
884 (let ((definition (car definitions)))
888 (walk-arglist (cadr definition)
892 (walk-declarations (cddr definition)
895 (walk-definitions (cdr definitions)))))))
896 (with-new-definition-in-environment (new-env old-env form)
899 (walk-definitions (cadr form))
900 (walk-declarations (cddr form)
904 (defun walk-flet (form context old-env)
905 (walker-environment-bind (old-env old-env)
906 (labels ((walk-definitions (definitions)
907 (if (null definitions)
910 (walk-lambda (car definitions) context old-env)
911 (walk-definitions (cdr definitions))))))
915 (walk-definitions (cadr form))
916 (with-new-definition-in-environment (new-env old-env form)
917 (walk-declarations (cddr form)
921 (defun walk-labels (form context old-env)
922 (walker-environment-bind (old-env old-env)
923 (with-new-definition-in-environment (new-env old-env form)
924 (labels ((walk-definitions (definitions)
925 (if (null definitions)
928 (walk-lambda (car definitions) context new-env)
929 (walk-definitions (cdr definitions))))))
933 (walk-definitions (cadr form))
934 (walk-declarations (cddr form)
938 (defun walk-if (form context env)
939 (destructuring-bind (if predicate arm1 &optional arm2) form
940 (declare (ignore if)) ; should be 'IF
943 (walk-form-internal predicate context env)
944 (walk-form-internal arm1 context env)
945 (walk-form-internal arm2 context env))))
950 ;;; Here are some examples of the kinds of things you should be able
951 ;;; to do with your implementation of the macroexpansion environment
952 ;;; hacking mechanism.
954 ;;; WITH-LEXICAL-MACROS is kind of like MACROLET, but it only takes
955 ;;; names of the macros and actual macroexpansion functions to use to
956 ;;; macroexpand them. The win about that is that for macros which want
957 ;;; to wrap several MACROLETs around their body, they can do this but
958 ;;; have the macroexpansion functions be compiled. See the WITH-RPUSH
961 ;;; If the implementation had a special way of communicating the
962 ;;; augmented environment back to the evaluator that would be totally
963 ;;; great. It would mean that we could just augment the environment
964 ;;; then pass control back to the implementations own compiler or
965 ;;; interpreter. We wouldn't have to call the actual walker. That
966 ;;; would make this much faster. Since the principal client of this is
967 ;;; defmethod it would make compiling defmethods faster and that would
968 ;;; certainly be a win.
970 (defmacro with-lexical-macros (macros &body body &environment old-env)
971 (with-augmented-environment (new-env old-env :macros macros)
972 (walk-form (cons 'progn body) :environment new-env)))
974 (defun expand-rpush (form env)
975 (declare (ignore env))
976 `(push ,(caddr form) ,(cadr form)))
978 (defmacro with-rpush (&body body)
979 `(with-lexical-macros ,(list (list 'rpush #'expand-rpush)) ,@body))