3 ;; copyright (C) 2013 David Vazquez
5 ;; JSCL is free software: you can redistribute it and/or
6 ;; modify it under the terms of the GNU General Public License as
7 ;; published by the Free Software Foundation, either version 3 of the
8 ;; License, or (at your option) any later version.
10 ;; JSCL is distributed in the hope that it will be useful, but
11 ;; WITHOUT ANY WARRANTY; without even the implied warranty of
12 ;; MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
13 ;; General Public License for more details.
15 ;; You should have received a copy of the GNU General Public License
16 ;; along with JSCL. If not, see <http://www.gnu.org/licenses/>.
25 (defmacro with-gensyms ((&rest vars) &body body)
26 `(let ,(mapcar (lambda (var) `(,var (gensym ,(string var)))) vars)
30 (and (consp x) (null (cdr x))))
36 ;;;; Lexical environment
38 ;;;; The Lexical environment is compromised of a list of bindings,
39 ;;;; which associates information to symbols. It tracks lexical
40 ;;;; variables, tags, local declarations and many other information in
41 ;;;; order to guide the compiler.
44 name type value declarations)
50 ;;;; Intermediate representation
52 ;;;; This intermediate representation (IR) is a simplified version of
53 ;;;; first intermediate representation what you will find if you have
54 ;;;; a you have the source code of SBCL. Some terminology is also
55 ;;;; used, but other is changed, so be careful if you assume you know
56 ;;;; what it is because you know the name.
59 ;;; A leaf stands for leaf in the tree of computations. Lexical
60 ;;; variables, constants and literal functions are leafs. Leafs are
61 ;;; not nodes itself, a `ref' node will stands for putting a leaf into
62 ;;; a lvar, which can be used in computations.
65 ;;; Reference a lexical variable. Special variables have not a
66 ;;; representation in IR. They are handled via the primitive functions
67 ;;; `%symbol-function' and `%symbol-value'.
68 (defstruct (var (:include leaf))
69 ;; Name is the symbol used to identify this variable in the lexical
73 ;;; A constant value, mostly from a quoted form, but maybe introduced
74 ;;; in some pass of the compiler.
75 (defstruct (constant (:include leaf))
78 ;;; A literal function. Why do we use `functional' as name? Well,
79 ;;; function is taken, isn't it?
80 (defstruct (functional (:include leaf))
81 ;; The symbol which names this function in the source code.
83 ;; A list of lvars which are bound to the argument values in a call
86 ;; LVAR which contains the return values of the function.
88 ;; The basic block which contain the code which be executed firstly
89 ;; when you call this function.
93 ;;; Used to transfer data between the computations in the intermediate
94 ;;; representation. Each node is valued into a LVar. And nodes which
95 ;;; use resulting values from other nodes use such LVar.
99 ;;; A computation node. It represents a simple computation in the
100 ;;; intermediate representation. Nodes are grouped in basic blocks,
101 ;;; which are delimited by the special nodes `block-entry' and
102 ;;; `block-exit'. Resulting value of the node is stored in LVAR, which it
103 ;;; could be null if the value is discarded.
109 ;;; Sentinel nodes. No computation really, but they make easier to
110 ;;; manipulate the doubly linked-list.
111 (defstruct (block-entry (:include node)))
112 (defstruct (block-exit (:include node)))
114 ;;; A reference to a leaf.
115 (defstruct (ref (:include node))
118 ;;; An assignation of the LVAR VALUE into the var VARIABLE.
119 (defstruct (assignment (:include node))
123 ;;; Call the lvar FUNCTION with a list of lvars as ARGUMENTS.
124 (defstruct (call (:include node))
128 ;;; A conditional branch. If the LVAR is not NIL, then we will jump to
129 ;;; the basic block CONSEQUENT, jumping to ALTERNATIVE otherwise. By
130 ;;; definition, a conditional must appear at the end of a basic block.
131 (defstruct (conditional (:include node))
136 ;;; Blocks are `basic block', which is a maximal sequence of nodes
137 ;;; with an entry point and an exit. Basic blocks are organized as a
138 ;;; control flow graph with some more information in omponents.
139 (defstruct (basic-block
140 (:conc-name "BLOCK-")
141 (:constructor make-block)
142 (:predicate block-p))
149 (defstruct (component-entry (:include basic-block)))
150 (defstruct (component-exit (:include basic-block)))
152 (defun make-empty-block ()
153 (let ((entry (make-block-entry))
154 (exit (make-block-exit)))
155 (setf (node-next entry) exit
156 (node-prev exit) entry)
157 (make-block :entry entry :exit exit)))
159 (defun empty-block-p (b)
160 (block-exit-p (node-next (block-entry b))))
163 ((node block &optional result &key include-sentinel-p) &body body)
164 `(do ((,node ,(if include-sentinel-p
165 `(block-entry ,block)
166 `(node-next (block-entry ,block)))
168 (,(if include-sentinel-p
170 `(block-exit-p ,node))
174 (defmacro do-nodes-backward
175 ((node block &optional result &key include-sentinel-p) &body body)
176 `(do ((,node ,(if include-sentinel-p
178 `(node-prev (block-entry ,block)))
180 (,(if include-sentinel-p
182 `(block-entry-p ,node))
186 ;;; Link FROM and TO nodes together. FROM and TO must belong to the
187 ;;; same basic block and appear in such order. The nodes between FROM
188 ;;; and TO are discarded.
189 (defun link-nodes (from to)
190 (setf (node-next from) to
194 ;;; Components are connected pieces of the control flow graph with
195 ;;; some additional information. Components have well-defined entry
196 ;;; and exit nodes. They also track what basic blocks we have and
197 ;;; other useful information. It is the toplevel organizational entity
198 ;;; in the compiler. The IR translation result is accumulated into
199 ;;; components incrementally.
200 (defstruct (component #-jscl (:print-object print-component))
204 ;;; Create a new component, compromised of the sentinel nodes and a
205 ;;; empty basic block, ready to start conversion to IR. It returnes
206 ;;; the component and the basic block as multiple values.
207 (defun make-empty-component ()
208 (let ((entry (make-component-entry))
209 (block (make-empty-block))
210 (exit (make-component-exit)))
211 (setf (block-succ entry) (list block)
212 (block-pred exit) (list block)
213 (block-succ block) (list exit)
214 (block-pred block) (list entry))
215 (values (make-component :entry entry :exit exit) block)))
217 ;;; Return the list of blocks in COMPONENT.
218 (defun component-blocks (component)
220 (labels ((compute-rdfo-from (block)
221 (unless (or (component-exit-p block) (find block output))
222 (dolist (successor (block-succ block))
223 (unless (component-exit-p block)
224 (compute-rdfo-from successor)))
225 (push block output))))
226 (compute-rdfo-from (unlist (block-succ (component-entry component))))
229 ;;; Iterate across different blocks in COMPONENT.
230 (defmacro do-blocks ((block component &optional result) &body body)
231 `(dolist (,block (component-blocks ,component) ,result)
234 (defun delete-empty-block (block)
235 (when (or (component-entry-p block) (component-exit-p block))
236 (error "Cannot delete entry or exit basic blocks."))
237 (unless (empty-block-p block)
238 (error "Block `~S' is not empty!" (block-id block)))
239 (let ((succ (unlist (block-succ block))))
240 (setf (block-pred succ) (remove block (block-pred succ)))
241 (dolist (pred (block-pred block))
242 (setf (block-succ pred) (substitute succ block (block-succ pred)))
243 (pushnew pred (block-pred succ)))))
245 (defun finish-component (component)
246 (do-blocks (block component)
247 (when (empty-block-p block)
248 (delete-empty-block block))))
252 ;;; The current component. We accumulate the results of the IR
253 ;;; conversion in this component.
256 ;;; Prepare a new component with a current empty block ready to start
257 ;;; IR conversion bound in the current cursor. BODY is evaluated and
258 ;;; the value of the last form is returned.
259 (defmacro with-component-compilation (&body body)
260 (let ((block (gensym)))
261 `(multiple-value-bind (*component* ,block)
262 (make-empty-component)
263 (with-cursor (:block ,block)
266 ;;; A cursor stands for a point between two nodes in some basic block
267 ;;; in the IR representation where manipulations can take place,
268 ;;; similarly to the cursors in text editing.
272 ;;; The current cursor. It is the point where IR manipulations act by
273 ;;; default. Particularly, newly converted IR code is inserted here.
276 ;;; Create a cursor which pointsto the basic block BLOCK. If omitted,
277 ;;; then the current block is used.
279 ;;; The keywords AFTER and BEFORE specify the cursor will point after
280 ;;; or before that node respectively. If none is specified, the cursor
281 ;;; is created before the exit node in BLOCK. An error is signaled if
282 ;;; both keywords are specified inconsistently, or if the nodes do not
285 ;;; The special values :ENTRY and :EXIT stands for the entry and exit
286 ;;; nodes of the block respectively.
287 (defun cursor (&key (block (cursor-block *cursor*))
288 (before nil before-p)
290 ;; Handle special values :ENTRY and :EXIT.
291 (flet ((node-designator (x)
293 (:entry (block-entry block))
294 (:exit (block-exit block))
296 (setq before (node-designator before))
297 (setq after (node-designator after)))
298 (let* ((next (or before (and after (node-next after)) (block-exit block)))
299 (cursor (make-cursor :block block :next next)))
300 (flet ((out-of-range-cursor ()
301 (error "Out of range cursor."))
303 (error "Ambiguous cursor specified between two non-adjacent nodes.")))
304 (when (or (null next) (block-entry-p next))
305 (out-of-range-cursor))
306 (when (and before-p after-p (not (eq after before)))
308 (do-nodes-backward (node block (out-of-range-cursor) :include-sentinel-p t)
309 (when (eq next node) (return))))
312 (defun set-cursor (&rest cursor-spec)
313 (let ((newcursor (apply #'cursor cursor-spec)))
314 (setf (cursor-block *cursor*) (cursor-block newcursor))
315 (setf (cursor-next *cursor*) (cursor-next newcursor))
318 ;;; Create and bind the current cursor. The cursor specification is
319 ;;; the same as described in the function `create-cursor'.
320 (defmacro with-cursor ((&rest cursor-spec) &body body)
321 `(let* ((*cursor* (cursor ,@cursor-spec)))
324 (defun end-of-block-p (&optional (cursor *cursor*))
325 (block-exit-p (cursor-next cursor)))
327 ;;; Insert NODE at cursor.
328 (defun insert-node (node &optional (cursor *cursor*))
329 (link-nodes (node-prev (cursor-next cursor)) node)
330 (link-nodes node (cursor-next cursor))
333 ;;; Split the block CURSOR points in two basic blocks, returning the
334 ;;; new basic block. The cursor is kept to point at the end of shrunk
336 (defun split-block (&optional (cursor *cursor*))
337 (let* ((block (cursor-block cursor))
338 (exit (block-exit block))
340 (newexit (make-block-exit))
341 (newentry (make-block-entry)))
342 (insert-node newexit)
343 (insert-node newentry)
344 (setf (node-next newexit) nil)
345 (setf (node-prev newentry) nil)
346 (setf (block-exit block) newexit)
347 (setq newblock (make-block :entry newentry :exit exit))
348 (shiftf (block-succ newblock) (block-succ block) (list newblock))
352 ;;; A alist of IR translator functions.
353 (defvar *ir-translator* nil)
355 ;;; Define a IR translator for NAME.
356 (defmacro define-ir-translator (name lambda-list &body body)
357 (check-type name symbol)
358 (let ((fname (intern (format nil "IR-CONVERT-~a" (string name))))
362 (defun ,fname (,form ,result)
363 (flet ((result-lvar () ,result))
364 (destructuring-bind ,lambda-list ,form
366 (push (cons ',name #',fname) *ir-translator*))))
368 (defun ir-convert-constant (form result)
369 (let* ((leaf (make-constant :value form)))
370 (insert-node (make-ref :leaf leaf :lvar result))))
372 (define-ir-translator quote (form)
373 (ir-convert-constant form (result-lvar)))
375 (define-ir-translator setq (variable value)
376 (let ((var (make-var :name variable))
377 (value-lvar (make-lvar)))
378 (ir-convert value value-lvar)
379 (let ((assign (make-assignment :variable var :value value-lvar :lvar (result-lvar))))
380 (insert-node assign))))
382 (define-ir-translator if (test then &optional else)
383 (when (conditional-p (cursor-next *cursor*))
384 (error "Impossible to insert a conditional after another conditional."))
385 ;; Split the basic block if we are in the middle of one.
386 (unless (end-of-block-p) (split-block))
387 (let* ((block (cursor-block *cursor*))
388 (test-lvar (make-lvar))
389 (then-block (make-empty-block))
390 (else-block (make-empty-block))
391 (join-block (make-empty-block))
392 (tail-block (unlist (block-succ block))))
393 ;; Insert conditional IR
394 (ir-convert test test-lvar)
395 (insert-node (make-conditional :test test-lvar :consequent then-block :alternative else-block))
396 ;; Link together the different created basic blocks.
397 (setf (block-succ block) (list else-block then-block)
398 (block-pred else-block) (list block)
399 (block-pred then-block) (list block)
400 (block-succ then-block) (list join-block)
401 (block-succ else-block) (list join-block)
402 (block-pred join-block) (list else-block then-block)
403 (block-succ join-block) (list tail-block)
404 (block-pred tail-block) (substitute join-block block (block-pred tail-block)))
405 ;; Convert he consequent and alternative forms and update cursor.
406 (ir-convert then (result-lvar) (cursor :block then-block))
407 (ir-convert else (result-lvar) (cursor :block else-block))
408 (set-cursor :block join-block)))
411 (defun ir-convert-var (form result)
412 (let* ((leaf (make-var :name form))
413 (ref (make-ref :leaf leaf :lvar result)))
416 (defun ir-convert-call (form result)
417 (destructuring-bind (function &rest args) form
418 (let ((func-lvar (make-lvar))
420 (when (symbolp function)
421 (ir-convert `(%symbol-function ,function) func-lvar))
423 (let ((arg-lvar (make-lvar)))
424 (push arg-lvar args-lvars)
425 (ir-convert arg arg-lvar)))
426 (setq args-lvars (reverse args-lvars))
427 (let ((call (make-call :function func-lvar :arguments args-lvars :lvar result)))
428 (insert-node call)))))
430 ;;; Convert the Lisp expression FORM into IR before the NEXT node, it
431 ;;; may create new basic blocks into the current component. During the
432 ;;; initial IR conversion, The NEXT node is the EXIT node of the
433 ;;; current basic block, but optimizations could call it to insert IR
435 (defun ir-convert (form &optional result (*cursor* *cursor*))
440 (ir-convert-var form result))
442 (ir-convert-constant form result))))
444 (destructuring-bind (op &rest args) form
445 (let ((translator (cdr (assoc op *ir-translator*))))
447 (funcall translator args result)
448 (ir-convert-call form result))))))
454 (defun print-node (node)
455 (when (node-lvar node)
456 (format t "~a = " (lvar-id (node-lvar node))))
459 (let ((leaf (ref-leaf node)))
462 (format t "~a" (var-name leaf)))
464 (format t "'~a" (constant-value leaf)))
466 (format t "#<function ~a at ~a>"
467 (functional-name leaf)
468 (functional-entry-point leaf))))))
470 (format t "set ~a ~a"
471 (var-name (assignment-variable node))
472 (lvar-id (assignment-value node))))
474 (format t "call ~a" (lvar-id (call-function node)))
475 (dolist (arg (call-arguments node))
476 (format t " ~a" (lvar-id arg))))
477 ((conditional-p node)
478 (format t "if ~a ~a ~a"
479 (lvar-id (conditional-test node))
480 (block-id (conditional-consequent node))
481 (block-id (conditional-alternative node))))
483 (error "`print-node' does not support printing ~S as a node." node)))
486 (defun print-block (block)
487 (flet ((block-name (block)
489 ((and (singlep (block-pred block))
490 (component-entry-p (block-pred block)))
492 ((component-exit-p block)
494 (t (string (block-id block))))))
495 (format t "BLOCK ~a:~%" (block-name block))
496 (do-nodes (node block)
498 (when (singlep (block-succ block))
499 (format t "GO ~a~%" (block-name (first (block-succ block)))))
502 (defun print-component (component &optional (stream *standard-output*))
503 (let ((*standard-output* stream))
504 (do-blocks (block component)
505 (print-block block))))
507 ;;; A few consistency checks in the IR useful for catching bugs.
508 (defun check-ir-consistency (&optional (component *component*))
509 (with-simple-restart (continue "Continue execution")
510 (do-blocks (block component)
511 (dolist (succ (block-succ block))
512 (unless (find block (block-pred succ))
513 (error "The block `~S' does not belong to the predecessors list of the its successor `~S'"
516 (dolist (pred (block-pred block))
517 (unless (find block (block-succ pred))
518 (error "The block `~S' does not belong to the successors' list of its predecessor `~S'"
520 (block-id pred)))))))
522 ;;; Translate FORM into IR and print a textual repreresentation of the
524 (defun describe-ir (form)
525 (with-component-compilation
526 (ir-convert form (make-lvar :id "$out"))
527 (finish-component *component*)
528 (check-ir-consistency)
529 (print-component *component*)))
532 ;;; compiler.lisp ends here