1 ;;;; Common Lisp pretty printer
3 ;;;; This software is part of the SBCL system. See the README file for
6 ;;;; This software is derived from the CMU CL system, which was
7 ;;;; written at Carnegie Mellon University and released into the
8 ;;;; public domain. The software is in the public domain and is
9 ;;;; provided with absolutely no warranty. See the COPYING and CREDITS
10 ;;;; files for more information.
12 (in-package "SB!PRETTY")
16 ;;; There are three different units for measuring character positions:
17 ;;; COLUMN - offset (if characters) from the start of the current line
18 ;;; INDEX - index into the output buffer
19 ;;; POSN - some position in the stream of characters cycling through
22 '(and fixnum unsigned-byte))
23 ;;; The INDEX type is picked up from the kernel package.
27 (defconstant initial-buffer-size 128)
29 (defconstant default-line-length 80)
31 (defstruct (pretty-stream (:include sb!kernel:ansi-stream
35 (:constructor make-pretty-stream (target))
37 ;; Where the output is going to finally go.
38 (target (missing-arg) :type stream)
39 ;; Line length we should format to. Cached here so we don't have to keep
40 ;; extracting it from the target stream.
41 (line-length (or *print-right-margin*
42 (sb!impl::line-length target)
45 ;; A simple string holding all the text that has been output but not yet
47 (buffer (make-string initial-buffer-size) :type simple-string)
48 ;; The index into BUFFER where more text should be put.
49 (buffer-fill-pointer 0 :type index)
50 ;; Whenever we output stuff from the buffer, we shift the remaining noise
51 ;; over. This makes it difficult to keep references to locations in
52 ;; the buffer. Therefore, we have to keep track of the total amount of
53 ;; stuff that has been shifted out of the buffer.
54 (buffer-offset 0 :type posn)
55 ;; The column the first character in the buffer will appear in. Normally
56 ;; zero, but if we end up with a very long line with no breaks in it we
57 ;; might have to output part of it. Then this will no longer be zero.
58 (buffer-start-column (or (sb!impl::charpos target) 0) :type column)
59 ;; The line number we are currently on. Used for *PRINT-LINES*
60 ;; abbreviations and to tell when sections have been split across
62 (line-number 0 :type index)
63 ;; the value of *PRINT-LINES* captured at object creation time. We
64 ;; use this, instead of the dynamic *PRINT-LINES*, to avoid
66 ;; (let ((*print-lines* 50))
67 ;; (pprint-logical-block ..
69 ;; (let ((*print-lines* 8))
70 ;; (print (aref possiblybigthings i) prettystream)))))
71 ;; terminating the output of the entire logical blockafter 8 lines.
72 (print-lines *print-lines* :type (or index null) :read-only t)
73 ;; Stack of logical blocks in effect at the buffer start.
74 (blocks (list (make-logical-block)) :type list)
75 ;; Buffer holding the per-line prefix active at the buffer start.
76 ;; Indentation is included in this. The length of this is stored
77 ;; in the logical block stack.
78 (prefix (make-string initial-buffer-size) :type simple-string)
79 ;; Buffer holding the total remaining suffix active at the buffer start.
80 ;; The characters are right-justified in the buffer to make it easier
81 ;; to output the buffer. The length is stored in the logical block
83 (suffix (make-string initial-buffer-size) :type simple-string)
84 ;; Queue of pending operations. When empty, HEAD=TAIL=NIL. Otherwise,
85 ;; TAIL holds the first (oldest) cons and HEAD holds the last (newest)
86 ;; cons. Adding things to the queue is basically (setf (cdr head) (list
87 ;; new)) and removing them is basically (pop tail) [except that care must
88 ;; be taken to handle the empty queue case correctly.]
89 (queue-tail nil :type list)
90 (queue-head nil :type list)
91 ;; Block-start queue entries in effect at the queue head.
92 (pending-blocks nil :type list))
93 (def!method print-object ((pstream pretty-stream) stream)
94 ;; FIXME: CMU CL had #+NIL'ed out this code and done a hand-written
95 ;; FORMAT hack instead. Make sure that this code actually works instead
96 ;; of falling into infinite regress or something.
97 (print-unreadable-object (pstream stream :type t :identity t)))
99 #!-sb-fluid (declaim (inline index-posn posn-index posn-column))
100 (defun index-posn (index stream)
101 (declare (type index index) (type pretty-stream stream)
103 (+ index (pretty-stream-buffer-offset stream)))
104 (defun posn-index (posn stream)
105 (declare (type posn posn) (type pretty-stream stream)
107 (- posn (pretty-stream-buffer-offset stream)))
108 (defun posn-column (posn stream)
109 (declare (type posn posn) (type pretty-stream stream)
111 (index-column (posn-index posn stream) stream))
113 ;;; Is it OK to do pretty printing on this stream at this time?
114 (defun print-pretty-on-stream-p (stream)
115 (and (pretty-stream-p stream)
118 ;;;; stream interface routines
120 (defun pretty-out (stream char)
121 (declare (type pretty-stream stream)
122 (type base-char char))
123 (cond ((char= char #\newline)
124 (enqueue-newline stream :literal))
126 (ensure-space-in-buffer stream 1)
127 (let ((fill-pointer (pretty-stream-buffer-fill-pointer stream)))
128 (setf (schar (pretty-stream-buffer stream) fill-pointer) char)
129 (setf (pretty-stream-buffer-fill-pointer stream)
130 (1+ fill-pointer))))))
132 (defun pretty-sout (stream string start end)
133 (declare (type pretty-stream stream)
134 (type simple-string string)
136 (type (or index null) end))
137 (let ((end (or end (length string))))
138 (unless (= start end)
139 (let ((newline (position #\newline string :start start :end end)))
142 (pretty-sout stream string start newline)
143 (enqueue-newline stream :literal)
144 (pretty-sout stream string (1+ newline) end))
146 (let ((chars (- end start)))
148 (let* ((available (ensure-space-in-buffer stream chars))
149 (count (min available chars))
150 (fill-pointer (pretty-stream-buffer-fill-pointer stream))
151 (new-fill-ptr (+ fill-pointer count)))
152 (replace (pretty-stream-buffer stream)
154 :start1 fill-pointer :end1 new-fill-ptr
156 (setf (pretty-stream-buffer-fill-pointer stream) new-fill-ptr)
160 (incf start count))))))))))
162 (defun pretty-misc (stream op &optional arg1 arg2)
163 (declare (ignore stream op arg1 arg2)))
167 (defstruct (logical-block (:copier nil))
168 ;; The column this logical block started in.
169 (start-column 0 :type column)
170 ;; The column the current section started in.
171 (section-column 0 :type column)
172 ;; The length of the per-line prefix. We can't move the indentation
174 (per-line-prefix-end 0 :type index)
175 ;; The overall length of the prefix, including any indentation.
176 (prefix-length 0 :type index)
177 ;; The overall length of the suffix.
178 (suffix-length 0 :type index)
180 (section-start-line 0 :type index))
182 (defun really-start-logical-block (stream column prefix suffix)
183 (let* ((blocks (pretty-stream-blocks stream))
184 (prev-block (car blocks))
185 (per-line-end (logical-block-per-line-prefix-end prev-block))
186 (prefix-length (logical-block-prefix-length prev-block))
187 (suffix-length (logical-block-suffix-length prev-block))
188 (block (make-logical-block
190 :section-column column
191 :per-line-prefix-end per-line-end
192 :prefix-length prefix-length
193 :suffix-length suffix-length
194 :section-start-line (pretty-stream-line-number stream))))
195 (setf (pretty-stream-blocks stream) (cons block blocks))
196 (set-indentation stream column)
198 (setf (logical-block-per-line-prefix-end block) column)
199 (replace (pretty-stream-prefix stream) prefix
200 :start1 (- column (length prefix)) :end1 column))
202 (let* ((total-suffix (pretty-stream-suffix stream))
203 (total-suffix-len (length total-suffix))
204 (additional (length suffix))
205 (new-suffix-len (+ suffix-length additional)))
206 (when (> new-suffix-len total-suffix-len)
207 (let ((new-total-suffix-len
208 (max (* total-suffix-len 2)
210 (floor (* additional 5) 4)))))
212 (replace (make-string new-total-suffix-len) total-suffix
213 :start1 (- new-total-suffix-len suffix-length)
214 :start2 (- total-suffix-len suffix-length)))
215 (setf total-suffix-len new-total-suffix-len)
216 (setf (pretty-stream-suffix stream) total-suffix)))
217 (replace total-suffix suffix
218 :start1 (- total-suffix-len new-suffix-len)
219 :end1 (- total-suffix-len suffix-length))
220 (setf (logical-block-suffix-length block) new-suffix-len))))
223 (defun set-indentation (stream column)
224 (let* ((prefix (pretty-stream-prefix stream))
225 (prefix-len (length prefix))
226 (block (car (pretty-stream-blocks stream)))
227 (current (logical-block-prefix-length block))
228 (minimum (logical-block-per-line-prefix-end block))
229 (column (max minimum column)))
230 (when (> column prefix-len)
232 (replace (make-string (max (* prefix-len 2)
234 (floor (* (- column prefix-len) 5)
238 (setf (pretty-stream-prefix stream) prefix))
239 (when (> column current)
240 (fill prefix #\space :start current :end column))
241 (setf (logical-block-prefix-length block) column)))
243 (defun really-end-logical-block (stream)
244 (let* ((old (pop (pretty-stream-blocks stream)))
245 (old-indent (logical-block-prefix-length old))
246 (new (car (pretty-stream-blocks stream)))
247 (new-indent (logical-block-prefix-length new)))
248 (when (> new-indent old-indent)
249 (fill (pretty-stream-prefix stream) #\space
250 :start old-indent :end new-indent)))
253 ;;;; the pending operation queue
255 (defstruct (queued-op (:constructor nil)
259 (defmacro enqueue (stream type &rest args)
260 (let ((constructor (symbolicate "MAKE-" type)))
261 (once-only ((stream stream)
262 (entry `(,constructor :posn
264 (pretty-stream-buffer-fill-pointer
269 (head `(pretty-stream-queue-head ,stream)))
272 (setf (cdr ,head) ,op)
273 (setf (pretty-stream-queue-tail ,stream) ,op))
274 (setf (pretty-stream-queue-head ,stream) ,op)
277 (defstruct (section-start (:include queued-op)
280 (depth 0 :type index)
281 (section-end nil :type (or null newline block-end)))
283 (defstruct (newline (:include section-start)
286 :type (member :linear :fill :miser :literal :mandatory)))
288 (defun enqueue-newline (stream kind)
289 (let* ((depth (length (pretty-stream-pending-blocks stream)))
290 (newline (enqueue stream newline :kind kind :depth depth)))
291 (dolist (entry (pretty-stream-queue-tail stream))
292 (when (and (not (eq newline entry))
293 (section-start-p entry)
294 (null (section-start-section-end entry))
295 (<= depth (section-start-depth entry)))
296 (setf (section-start-section-end entry) newline))))
297 (maybe-output stream (or (eq kind :literal) (eq kind :mandatory))))
299 (defstruct (indentation (:include queued-op)
301 (kind (missing-arg) :type (member :block :current))
302 (amount 0 :type fixnum))
304 (defun enqueue-indent (stream kind amount)
305 (enqueue stream indentation :kind kind :amount amount))
307 (defstruct (block-start (:include section-start)
309 (block-end nil :type (or null block-end))
310 (prefix nil :type (or null simple-string))
311 (suffix nil :type (or null simple-string)))
313 (defun start-logical-block (stream prefix per-line-p suffix)
314 ;; (In the PPRINT-LOGICAL-BLOCK form which calls us,
315 ;; :PREFIX and :PER-LINE-PREFIX have hairy defaulting behavior,
316 ;; and might end up being NIL.)
317 (declare (type (or null string prefix)))
318 ;; (But the defaulting behavior of PPRINT-LOGICAL-BLOCK :SUFFIX is
319 ;; trivial, so it should always be a string.)
320 (declare (type string suffix))
322 (pretty-sout stream prefix 0 (length prefix)))
323 (let* ((pending-blocks (pretty-stream-pending-blocks stream))
324 (start (enqueue stream block-start
325 :prefix (and per-line-p prefix)
327 :depth (length pending-blocks))))
328 (setf (pretty-stream-pending-blocks stream)
329 (cons start pending-blocks))))
331 (defstruct (block-end (:include queued-op)
333 (suffix nil :type (or null simple-string)))
335 (defun end-logical-block (stream)
336 (let* ((start (pop (pretty-stream-pending-blocks stream)))
337 (suffix (block-start-suffix start))
338 (end (enqueue stream block-end :suffix suffix)))
340 (pretty-sout stream suffix 0 (length suffix)))
341 (setf (block-start-block-end start) end)))
343 (defstruct (tab (:include queued-op)
345 (sectionp nil :type (member t nil))
346 (relativep nil :type (member t nil))
347 (colnum 0 :type column)
348 (colinc 0 :type column))
350 (defun enqueue-tab (stream kind colnum colinc)
351 (multiple-value-bind (sectionp relativep)
353 (:line (values nil nil))
354 (:line-relative (values nil t))
355 (:section (values t nil))
356 (:section-relative (values t t)))
357 (enqueue stream tab :sectionp sectionp :relativep relativep
358 :colnum colnum :colinc colinc)))
362 (defun compute-tab-size (tab section-start column)
363 (let ((origin (if (tab-sectionp tab) section-start 0))
364 (colnum (tab-colnum tab))
365 (colinc (tab-colinc tab)))
366 (cond ((tab-relativep tab)
367 (unless (<= colinc 1)
368 (let ((newposn (+ column colnum)))
369 (let ((rem (rem newposn colinc)))
371 (incf colnum (- colinc rem))))))
373 ((<= column (+ colnum origin))
374 (- (+ colnum origin) column))
377 (rem (- column origin) colinc))))))
379 (defun index-column (index stream)
380 (let ((column (pretty-stream-buffer-start-column stream))
381 (section-start (logical-block-section-column
382 (first (pretty-stream-blocks stream))))
383 (end-posn (index-posn index stream)))
384 (dolist (op (pretty-stream-queue-tail stream))
385 (when (>= (queued-op-posn op) end-posn)
393 (posn-index (tab-posn op)
395 ((or newline block-start)
397 (+ column (posn-index (queued-op-posn op)
401 (defun expand-tabs (stream through)
402 (let ((insertions nil)
404 (column (pretty-stream-buffer-start-column stream))
405 (section-start (logical-block-section-column
406 (first (pretty-stream-blocks stream)))))
407 (dolist (op (pretty-stream-queue-tail stream))
410 (let* ((index (posn-index (tab-posn op) stream))
411 (tabsize (compute-tab-size op
414 (unless (zerop tabsize)
415 (push (cons index tabsize) insertions)
416 (incf additional tabsize)
417 (incf column tabsize))))
418 ((or newline block-start)
420 (+ column (posn-index (queued-op-posn op) stream)))))
421 (when (eq op through)
424 (let* ((fill-ptr (pretty-stream-buffer-fill-pointer stream))
425 (new-fill-ptr (+ fill-ptr additional))
426 (buffer (pretty-stream-buffer stream))
428 (length (length buffer))
430 (when (> new-fill-ptr length)
431 (let ((new-length (max (* length 2)
433 (floor (* additional 5) 4)))))
434 (setf new-buffer (make-string new-length))
435 (setf (pretty-stream-buffer stream) new-buffer)))
436 (setf (pretty-stream-buffer-fill-pointer stream) new-fill-ptr)
437 (decf (pretty-stream-buffer-offset stream) additional)
438 (dolist (insertion insertions)
439 (let* ((srcpos (car insertion))
440 (amount (cdr insertion))
441 (dstpos (+ srcpos additional)))
442 (replace new-buffer buffer :start1 dstpos :start2 srcpos :end2 end)
443 (fill new-buffer #\space :start (- dstpos amount) :end dstpos)
444 (decf additional amount)
446 (unless (eq new-buffer buffer)
447 (replace new-buffer buffer :end1 end :end2 end))))))
449 ;;;; stuff to do the actual outputting
451 (defun ensure-space-in-buffer (stream want)
452 (declare (type pretty-stream stream)
454 (let* ((buffer (pretty-stream-buffer stream))
455 (length (length buffer))
456 (fill-ptr (pretty-stream-buffer-fill-pointer stream))
457 (available (- length fill-ptr)))
458 (cond ((plusp available)
460 ((> fill-ptr (pretty-stream-line-length stream))
461 (unless (maybe-output stream nil)
462 (output-partial-line stream))
463 (ensure-space-in-buffer stream want))
465 (let* ((new-length (max (* length 2)
467 (floor (* want 5) 4))))
468 (new-buffer (make-string new-length)))
469 (setf (pretty-stream-buffer stream) new-buffer)
470 (replace new-buffer buffer :end1 fill-ptr)
471 (- new-length fill-ptr))))))
473 (defun maybe-output (stream force-newlines-p)
474 (declare (type pretty-stream stream))
475 (let ((tail (pretty-stream-queue-tail stream))
476 (output-anything nil))
479 (setf (pretty-stream-queue-head stream) nil)
481 (let ((next (pop tail)))
484 (when (ecase (newline-kind next)
485 ((:literal :mandatory :linear) t)
486 (:miser (misering-p stream))
488 (or (misering-p stream)
489 (> (pretty-stream-line-number stream)
490 (logical-block-section-start-line
491 (first (pretty-stream-blocks stream))))
492 (ecase (fits-on-line-p stream
493 (newline-section-end next)
499 (setf output-anything t)
500 (output-line stream next)))
502 (unless (misering-p stream)
503 (set-indentation stream
504 (+ (ecase (indentation-kind next)
506 (logical-block-start-column
507 (car (pretty-stream-blocks stream))))
510 (indentation-posn next)
512 (indentation-amount next)))))
514 (ecase (fits-on-line-p stream (block-start-section-end next)
517 ;; Just nuke the whole logical block and make it look
518 ;; like one nice long literal.
519 (let ((end (block-start-block-end next)))
520 (expand-tabs stream end)
521 (setf tail (cdr (member end tail)))))
523 (really-start-logical-block
525 (posn-column (block-start-posn next) stream)
526 (block-start-prefix next)
527 (block-start-suffix next)))
531 (really-end-logical-block stream))
533 (expand-tabs stream next))))
534 (setf (pretty-stream-queue-tail stream) tail))
537 (defun misering-p (stream)
538 (declare (type pretty-stream stream))
539 (and *print-miser-width*
540 (<= (- (pretty-stream-line-length stream)
541 (logical-block-start-column (car (pretty-stream-blocks stream))))
542 *print-miser-width*)))
544 (defun fits-on-line-p (stream until force-newlines-p)
545 (let ((available (pretty-stream-line-length stream)))
546 (when (and (not *print-readably*)
547 (pretty-stream-print-lines stream)
548 (= (pretty-stream-print-lines stream)
549 (pretty-stream-line-number stream)))
550 (decf available 3) ; for the `` ..''
551 (decf available (logical-block-suffix-length
552 (car (pretty-stream-blocks stream)))))
554 (<= (posn-column (queued-op-posn until) stream) available))
555 (force-newlines-p nil)
556 ((> (index-column (pretty-stream-buffer-fill-pointer stream) stream)
562 (defun output-line (stream until)
563 (declare (type pretty-stream stream)
564 (type newline until))
565 (let* ((target (pretty-stream-target stream))
566 (buffer (pretty-stream-buffer stream))
567 (kind (newline-kind until))
568 (literal-p (eq kind :literal))
569 (amount-to-consume (posn-index (newline-posn until) stream))
573 (let ((last-non-blank
574 (position #\space buffer :end amount-to-consume
575 :from-end t :test #'char/=)))
579 (write-string buffer target :end amount-to-print)
580 (let ((line-number (pretty-stream-line-number stream)))
582 (when (and (not *print-readably*)
583 (pretty-stream-print-lines stream)
584 (>= line-number (pretty-stream-print-lines stream)))
585 (write-string " .." target)
586 (let ((suffix-length (logical-block-suffix-length
587 (car (pretty-stream-blocks stream)))))
588 (unless (zerop suffix-length)
589 (let* ((suffix (pretty-stream-suffix stream))
590 (len (length suffix)))
591 (write-string suffix target
592 :start (- len suffix-length)
594 (throw 'line-limit-abbreviation-happened t))
595 (setf (pretty-stream-line-number stream) line-number)
596 (write-char #\newline target)
597 (setf (pretty-stream-buffer-start-column stream) 0)
598 (let* ((fill-ptr (pretty-stream-buffer-fill-pointer stream))
599 (block (first (pretty-stream-blocks stream)))
602 (logical-block-per-line-prefix-end block)
603 (logical-block-prefix-length block)))
604 (shift (- amount-to-consume prefix-len))
605 (new-fill-ptr (- fill-ptr shift))
607 (buffer-length (length buffer)))
608 (when (> new-fill-ptr buffer-length)
610 (make-string (max (* buffer-length 2)
612 (floor (* (- new-fill-ptr buffer-length)
615 (setf (pretty-stream-buffer stream) new-buffer))
616 (replace new-buffer buffer
617 :start1 prefix-len :start2 amount-to-consume :end2 fill-ptr)
618 (replace new-buffer (pretty-stream-prefix stream)
620 (setf (pretty-stream-buffer-fill-pointer stream) new-fill-ptr)
621 (incf (pretty-stream-buffer-offset stream) shift)
623 (setf (logical-block-section-column block) prefix-len)
624 (setf (logical-block-section-start-line block) line-number))))))
626 (defun output-partial-line (stream)
627 (let* ((fill-ptr (pretty-stream-buffer-fill-pointer stream))
628 (tail (pretty-stream-queue-tail stream))
631 (posn-index (queued-op-posn (car tail)) stream)
633 (new-fill-ptr (- fill-ptr count))
634 (buffer (pretty-stream-buffer stream)))
636 (error "Output-partial-line called when nothing can be output."))
637 (write-string buffer (pretty-stream-target stream)
639 (incf (pretty-stream-buffer-start-column stream) count)
640 (replace buffer buffer :end1 new-fill-ptr :start2 count :end2 fill-ptr)
641 (setf (pretty-stream-buffer-fill-pointer stream) new-fill-ptr)
642 (incf (pretty-stream-buffer-offset stream) count)))
644 (defun force-pretty-output (stream)
645 (maybe-output stream nil)
646 (expand-tabs stream nil)
647 (write-string (pretty-stream-buffer stream)
648 (pretty-stream-target stream)
649 :end (pretty-stream-buffer-fill-pointer stream)))
651 ;;;; user interface to the pretty printer
653 (defun pprint-newline (kind &optional stream)
655 "Output a conditional newline to STREAM (which defaults to
656 *STANDARD-OUTPUT*) if it is a pretty-printing stream, and do
657 nothing if not. KIND can be one of:
658 :LINEAR - A line break is inserted if and only if the immediatly
659 containing section cannot be printed on one line.
660 :MISER - Same as LINEAR, but only if ``miser-style'' is in effect.
661 (See *PRINT-MISER-WIDTH*.)
662 :FILL - A line break is inserted if and only if either:
663 (a) the following section cannot be printed on the end of the
665 (b) the preceding section was not printed on a single line, or
666 (c) the immediately containing section cannot be printed on one
667 line and miser-style is in effect.
668 :MANDATORY - A line break is always inserted.
669 When a line break is inserted by any type of conditional newline, any
670 blanks that immediately precede the conditional newline are ommitted
671 from the output and indentation is introduced at the beginning of the
672 next line. (See PPRINT-INDENT.)"
673 (declare (type (member :linear :miser :fill :mandatory) kind)
674 (type (or stream (member t nil)) stream)
676 (let ((stream (case stream
678 ((nil) *standard-output*)
680 (when (print-pretty-on-stream-p stream)
681 (enqueue-newline stream kind)))
684 (defun pprint-indent (relative-to n &optional stream)
686 "Specify the indentation to use in the current logical block if STREAM
687 (which defaults to *STANDARD-OUTPUT*) is it is a pretty-printing stream
688 and do nothing if not. (See PPRINT-LOGICAL-BLOCK.) N is the indention
689 to use (in ems, the width of an ``m'') and RELATIVE-TO can be either:
690 :BLOCK - Indent relative to the column the current logical block
692 :CURRENT - Indent relative to the current column.
693 The new indention value does not take effect until the following line
695 (declare (type (member :block :current) relative-to)
697 (type (or stream (member t nil)) stream)
699 (let ((stream (case stream
701 ((nil) *standard-output*)
703 (when (print-pretty-on-stream-p stream)
704 (enqueue-indent stream relative-to n)))
707 (defun pprint-tab (kind colnum colinc &optional stream)
709 "If STREAM (which defaults to *STANDARD-OUTPUT*) is a pretty-printing
710 stream, perform tabbing based on KIND, otherwise do nothing. KIND can
712 :LINE - Tab to column COLNUM. If already past COLNUM tab to the next
714 :SECTION - Same as :LINE, but count from the start of the current
715 section, not the start of the line.
716 :LINE-RELATIVE - Output COLNUM spaces, then tab to the next multiple of
718 :SECTION-RELATIVE - Same as :LINE-RELATIVE, but count from the start
719 of the current section, not the start of the line."
720 (declare (type (member :line :section :line-relative :section-relative) kind)
721 (type unsigned-byte colnum colinc)
722 (type (or stream (member t nil)) stream)
724 (let ((stream (case stream
726 ((nil) *standard-output*)
728 (when (print-pretty-on-stream-p stream)
729 (enqueue-tab stream kind colnum colinc)))
732 (defun pprint-fill (stream list &optional (colon? t) atsign?)
734 "Output LIST to STREAM putting :FILL conditional newlines between each
735 element. If COLON? is NIL (defaults to T), then no parens are printed
736 around the output. ATSIGN? is ignored (but allowed so that PPRINT-FILL
737 can be used with the ~/.../ format directive."
738 (declare (ignore atsign?))
739 (pprint-logical-block (stream list
740 :prefix (if colon? "(" "")
741 :suffix (if colon? ")" ""))
742 (pprint-exit-if-list-exhausted)
744 (output-object (pprint-pop) stream)
745 (pprint-exit-if-list-exhausted)
746 (write-char #\space stream)
747 (pprint-newline :fill stream))))
749 (defun pprint-linear (stream list &optional (colon? t) atsign?)
751 "Output LIST to STREAM putting :LINEAR conditional newlines between each
752 element. If COLON? is NIL (defaults to T), then no parens are printed
753 around the output. ATSIGN? is ignored (but allowed so that PPRINT-LINEAR
754 can be used with the ~/.../ format directive."
755 (declare (ignore atsign?))
756 (pprint-logical-block (stream list
757 :prefix (if colon? "(" "")
758 :suffix (if colon? ")" ""))
759 (pprint-exit-if-list-exhausted)
761 (output-object (pprint-pop) stream)
762 (pprint-exit-if-list-exhausted)
763 (write-char #\space stream)
764 (pprint-newline :linear stream))))
766 (defun pprint-tabular (stream list &optional (colon? t) atsign? tabsize)
768 "Output LIST to STREAM tabbing to the next column that is an even multiple
769 of TABSIZE (which defaults to 16) between each element. :FILL style
770 conditional newlines are also output between each element. If COLON? is
771 NIL (defaults to T), then no parens are printed around the output.
772 ATSIGN? is ignored (but allowed so that PPRINT-TABULAR can be used with
773 the ~/.../ format directive."
774 (declare (ignore atsign?))
775 (pprint-logical-block (stream list
776 :prefix (if colon? "(" "")
777 :suffix (if colon? ")" ""))
778 (pprint-exit-if-list-exhausted)
780 (output-object (pprint-pop) stream)
781 (pprint-exit-if-list-exhausted)
782 (write-char #\space stream)
783 (pprint-tab :section-relative 0 (or tabsize 16) stream)
784 (pprint-newline :fill stream))))
786 ;;;; pprint-dispatch tables
788 (defvar *initial-pprint-dispatch*)
789 (defvar *building-initial-table* nil)
791 (defstruct (pprint-dispatch-entry (:copier nil))
792 ;; the type specifier for this entry
793 (type (missing-arg) :type t)
794 ;; a function to test to see whether an object is of this time.
795 ;; Pretty must just (LAMBDA (OBJ) (TYPEP OBJECT TYPE)) except that
796 ;; we handle the CONS type specially so that (CONS (MEMBER FOO))
797 ;; works. We don't bother computing this for entries in the CONS
798 ;; hash table, because we don't need it.
799 (test-fn nil :type (or function null))
800 ;; the priority for this guy
801 (priority 0 :type real)
802 ;; T iff one of the original entries.
803 (initial-p *building-initial-table* :type (member t nil))
804 ;; and the associated function
805 (fun (missing-arg) :type function))
806 (def!method print-object ((entry pprint-dispatch-entry) stream)
807 (print-unreadable-object (entry stream :type t)
808 (format stream "type=~S, priority=~S~@[ [initial]~]"
809 (pprint-dispatch-entry-type entry)
810 (pprint-dispatch-entry-priority entry)
811 (pprint-dispatch-entry-initial-p entry))))
813 (defstruct (pprint-dispatch-table (:copier nil))
814 ;; A list of all the entries (except for CONS entries below) in highest
815 ;; to lowest priority.
816 (entries nil :type list)
817 ;; A hash table mapping things to entries for type specifiers of the
818 ;; form (CONS (MEMBER <thing>)). If the type specifier is of this form,
819 ;; we put it in this hash table instead of the regular entries table.
820 (cons-entries (make-hash-table :test 'eql)))
821 (def!method print-object ((table pprint-dispatch-table) stream)
822 (print-unreadable-object (table stream :type t :identity t)))
824 (defun cons-type-specifier-p (spec)
826 (eq (car spec) 'cons)
829 (let ((car (cadr spec)))
831 (let ((carcar (car car)))
832 (or (eq carcar 'member)
835 (null (cddr car))))))
837 (defun entry< (e1 e2)
838 (declare (type pprint-dispatch-entry e1 e2))
839 (if (pprint-dispatch-entry-initial-p e1)
840 (if (pprint-dispatch-entry-initial-p e2)
841 (< (pprint-dispatch-entry-priority e1)
842 (pprint-dispatch-entry-priority e2))
844 (if (pprint-dispatch-entry-initial-p e2)
846 (< (pprint-dispatch-entry-priority e1)
847 (pprint-dispatch-entry-priority e2)))))
850 `(cons ',x (lambda (object) ,x))))
851 (defvar *precompiled-pprint-dispatch-funs*
852 (list (frob (typep object 'array))
853 (frob (and (consp object)
854 (symbolp (car object))
855 (fboundp (car object))))
856 (frob (typep object 'cons)))))
858 (defun compute-test-fn (type)
859 (let ((was-cons nil))
860 (labels ((compute-test-expr (type object)
866 (&optional (car nil car-p) (cdr nil cdr-p))
868 `(and (consp ,object)
870 `(,(compute-test-expr
871 car `(car ,object))))
873 `(,(compute-test-expr
874 cdr `(cdr ,object)))))))
876 (destructuring-bind (type) (cdr type)
877 `(not ,(compute-test-expr type object))))
879 `(and ,@(mapcar (lambda (type)
880 (compute-test-expr type object))
883 `(or ,@(mapcar (lambda (type)
884 (compute-test-expr type object))
887 `(typep ,object ',type)))
888 `(typep ,object ',type))))
889 (let ((expr (compute-test-expr type 'object)))
890 (cond ((cdr (assoc expr *precompiled-pprint-dispatch-funs*
893 (compile nil `(lambda (object) ,expr))))))))
895 (defun copy-pprint-dispatch (&optional (table *print-pprint-dispatch*))
896 (declare (type (or pprint-dispatch-table null) table))
897 (let* ((orig (or table *initial-pprint-dispatch*))
898 (new (make-pprint-dispatch-table
899 :entries (copy-list (pprint-dispatch-table-entries orig))))
900 (new-cons-entries (pprint-dispatch-table-cons-entries new)))
901 (maphash (lambda (key value)
902 (setf (gethash key new-cons-entries) value))
903 (pprint-dispatch-table-cons-entries orig))
906 (defun pprint-dispatch (object &optional (table *print-pprint-dispatch*))
907 (declare (type (or pprint-dispatch-table null) table))
908 (let* ((table (or table *initial-pprint-dispatch*))
911 (gethash (car object)
912 (pprint-dispatch-table-cons-entries table))))
914 (dolist (entry (pprint-dispatch-table-entries table) cons-entry)
915 (when (and cons-entry
916 (entry< entry cons-entry))
918 (when (funcall (pprint-dispatch-entry-test-fn entry) object)
921 (values (pprint-dispatch-entry-fun entry) t)
922 (values (lambda (stream object)
923 (output-ugly-object object stream))
926 (defun set-pprint-dispatch (type function &optional
927 (priority 0) (table *print-pprint-dispatch*))
928 (declare (type (or null function) function)
930 (type pprint-dispatch-table table))
931 (/show0 "entering SET-PPRINT-DISPATCH, TYPE=...")
934 (if (cons-type-specifier-p type)
935 (setf (gethash (second (second type))
936 (pprint-dispatch-table-cons-entries table))
937 (make-pprint-dispatch-entry :type type
940 (let ((list (delete type (pprint-dispatch-table-entries table)
941 :key #'pprint-dispatch-entry-type
943 (entry (make-pprint-dispatch-entry
945 :test-fn (compute-test-fn type)
949 (next list (cdr next)))
952 (setf (cdr prev) (list entry))
953 (setf list (list entry))))
954 (when (entry< (car next) entry)
956 (setf (cdr prev) (cons entry next))
957 (setf list (cons entry next)))
959 (setf (pprint-dispatch-table-entries table) list)))
960 (if (cons-type-specifier-p type)
961 (remhash (second (second type))
962 (pprint-dispatch-table-cons-entries table))
963 (setf (pprint-dispatch-table-entries table)
964 (delete type (pprint-dispatch-table-entries table)
965 :key #'pprint-dispatch-entry-type
967 (/show0 "about to return NIL from SET-PPRINT-DISPATCH")
970 ;;;; standard pretty-printing routines
972 (defun pprint-array (stream array)
973 (cond ((or (and (null *print-array*) (null *print-readably*))
975 (bit-vector-p array))
976 (output-ugly-object array stream))
977 ((and *print-readably*
978 (not (array-readably-printable-p array)))
979 (let ((*print-readably* nil))
980 (error 'print-not-readable :object array)))
982 (pprint-vector stream array))
984 (pprint-multi-dim-array stream array))))
986 (defun pprint-vector (stream vector)
987 (pprint-logical-block (stream nil :prefix "#(" :suffix ")")
988 (dotimes (i (length vector))
990 (format stream " ~:_"))
992 (output-object (aref vector i) stream))))
994 (defun pprint-multi-dim-array (stream array)
995 (funcall (formatter "#~DA") stream (array-rank array))
996 (with-array-data ((data array) (start) (end))
997 (declare (ignore end))
998 (labels ((output-guts (stream index dimensions)
999 (if (null dimensions)
1000 (output-object (aref data index) stream)
1001 (pprint-logical-block
1002 (stream nil :prefix "(" :suffix ")")
1003 (let ((dim (car dimensions)))
1005 (let* ((dims (cdr dimensions))
1007 (step (reduce #'* dims))
1011 (output-guts stream index dims)
1012 (when (= (incf count) dim)
1014 (write-char #\space stream)
1015 (pprint-newline (if dims :linear :fill)
1017 (incf index step)))))))))
1018 (output-guts stream start (array-dimensions array)))))
1020 (defun pprint-lambda-list (stream lambda-list &rest noise)
1021 (declare (ignore noise))
1022 (pprint-logical-block (stream lambda-list :prefix "(" :suffix ")")
1023 (let ((state :required)
1026 (pprint-exit-if-list-exhausted)
1028 (write-char #\space stream))
1029 (let ((arg (pprint-pop)))
1033 (setf state :optional)
1034 (pprint-newline :linear stream))
1036 (setf state :required)
1037 (pprint-newline :linear stream))
1040 (pprint-newline :linear stream))
1042 (setf state :optional)
1043 (pprint-newline :linear stream))
1045 (pprint-newline :fill stream))))
1048 (pprint-lambda-list stream arg))
1050 (pprint-logical-block
1051 (stream arg :prefix "(" :suffix ")")
1052 (pprint-exit-if-list-exhausted)
1054 (pprint-logical-block
1055 (stream (pprint-pop) :prefix "(" :suffix ")")
1056 (pprint-exit-if-list-exhausted)
1057 (output-object (pprint-pop) stream)
1058 (pprint-exit-if-list-exhausted)
1059 (write-char #\space stream)
1060 (pprint-newline :fill stream)
1061 (pprint-lambda-list stream (pprint-pop))
1063 (pprint-exit-if-list-exhausted)
1064 (write-char #\space stream)
1065 (pprint-newline :fill stream)
1066 (output-object (pprint-pop) stream)))
1067 (pprint-lambda-list stream (pprint-pop)))
1069 (pprint-exit-if-list-exhausted)
1070 (write-char #\space stream)
1071 (pprint-newline :linear stream)
1072 (output-object (pprint-pop) stream))))))
1073 (setf first nil)))))
1075 (defun pprint-lambda (stream list &rest noise)
1076 (declare (ignore noise))
1078 ;; KLUDGE: This format string, and other format strings which also
1079 ;; refer to SB!PRETTY, rely on the current SBCL not-quite-ANSI
1080 ;; behavior of FORMATTER in order to make code which survives the
1081 ;; transition when SB!PRETTY is renamed to SB-PRETTY after cold
1082 ;; init. (ANSI says that the FORMATTER functions should be
1083 ;; equivalent to the format string, but the SBCL FORMATTER
1084 ;; functions contain references to package objects, not package
1085 ;; names, so they keep right on going if the packages are renamed.)
1086 ;; If our FORMATTER behavior is ever made more compliant, the code
1087 ;; here will have to change. -- WHN 19991207
1088 "~:<~^~W~^~3I ~:_~/SB!PRETTY:PPRINT-LAMBDA-LIST/~1I~@{ ~_~W~}~:>")
1092 (defun pprint-block (stream list &rest noise)
1093 (declare (ignore noise))
1094 (funcall (formatter "~:<~^~W~^~3I ~:_~W~1I~@{ ~_~W~}~:>") stream list))
1096 (defun pprint-flet (stream list &rest noise)
1097 (declare (ignore noise))
1099 "~:<~^~W~^ ~@_~:<~@{~:<~^~W~^~3I ~:_~/SB!PRETTY:PPRINT-LAMBDA-LIST/~1I~:@_~@{~W~^ ~_~}~:>~^ ~_~}~:>~1I~@:_~@{~W~^ ~_~}~:>")
1103 (defun pprint-let (stream list &rest noise)
1104 (declare (ignore noise))
1105 (funcall (formatter "~:<~^~W~^ ~@_~:<~@{~:<~^~W~@{ ~_~W~}~:>~^ ~_~}~:>~1I~:@_~@{~W~^ ~_~}~:>")
1109 (defun pprint-progn (stream list &rest noise)
1110 (declare (ignore noise))
1111 (funcall (formatter "~:<~^~W~@{ ~_~W~}~:>") stream list))
1113 (defun pprint-progv (stream list &rest noise)
1114 (declare (ignore noise))
1115 (funcall (formatter "~:<~^~W~^~3I ~_~W~^ ~_~W~^~1I~@{ ~_~W~}~:>")
1118 (defun pprint-quote (stream list &rest noise)
1119 (declare (ignore noise))
1120 (if (and (consp list)
1125 (write-string "#'" stream)
1126 (output-object (cadr list) stream))
1128 (write-char #\' stream)
1129 (output-object (cadr list) stream))
1131 (pprint-fill stream list)))
1132 (pprint-fill stream list)))
1134 (defun pprint-setq (stream list &rest noise)
1135 (declare (ignore noise))
1136 (pprint-logical-block (stream list :prefix "(" :suffix ")")
1137 (pprint-exit-if-list-exhausted)
1138 (output-object (pprint-pop) stream)
1139 (pprint-exit-if-list-exhausted)
1140 (write-char #\space stream)
1141 (pprint-newline :miser stream)
1142 (if (and (consp (cdr list)) (consp (cddr list)))
1144 (pprint-indent :current 2 stream)
1145 (output-object (pprint-pop) stream)
1146 (pprint-exit-if-list-exhausted)
1147 (write-char #\space stream)
1148 (pprint-newline :linear stream)
1149 (pprint-indent :current -2 stream)
1150 (output-object (pprint-pop) stream)
1151 (pprint-exit-if-list-exhausted)
1152 (write-char #\space stream)
1153 (pprint-newline :linear stream))
1155 (pprint-indent :current 0 stream)
1156 (output-object (pprint-pop) stream)
1157 (pprint-exit-if-list-exhausted)
1158 (write-char #\space stream)
1159 (pprint-newline :linear stream)
1160 (output-object (pprint-pop) stream)))))
1162 ;;; FIXME: could become SB!XC:DEFMACRO wrapped in EVAL-WHEN (COMPILE EVAL)
1163 (defmacro pprint-tagbody-guts (stream)
1165 (pprint-exit-if-list-exhausted)
1166 (write-char #\space ,stream)
1167 (let ((form-or-tag (pprint-pop)))
1168 (pprint-indent :block
1169 (if (atom form-or-tag) 0 1)
1171 (pprint-newline :linear ,stream)
1172 (output-object form-or-tag ,stream))))
1174 (defun pprint-tagbody (stream list &rest noise)
1175 (declare (ignore noise))
1176 (pprint-logical-block (stream list :prefix "(" :suffix ")")
1177 (pprint-exit-if-list-exhausted)
1178 (output-object (pprint-pop) stream)
1179 (pprint-tagbody-guts stream)))
1181 (defun pprint-case (stream list &rest noise)
1182 (declare (ignore noise))
1184 "~:<~^~W~^ ~3I~:_~W~1I~@{ ~_~:<~^~:/SB!PRETTY:PPRINT-FILL/~^~@{ ~_~W~}~:>~}~:>")
1188 (defun pprint-defun (stream list &rest noise)
1189 (declare (ignore noise))
1191 "~:<~^~W~^ ~@_~:I~W~^ ~:_~/SB!PRETTY:PPRINT-LAMBDA-LIST/~1I~@{ ~_~W~}~:>")
1195 (defun pprint-destructuring-bind (stream list &rest noise)
1196 (declare (ignore noise))
1198 "~:<~^~W~^~3I ~_~:/SB!PRETTY:PPRINT-LAMBDA-LIST/~^ ~_~W~^~1I~@{ ~_~W~}~:>")
1201 (defun pprint-do (stream list &rest noise)
1202 (declare (ignore noise))
1203 (pprint-logical-block (stream list :prefix "(" :suffix ")")
1204 (pprint-exit-if-list-exhausted)
1205 (output-object (pprint-pop) stream)
1206 (pprint-exit-if-list-exhausted)
1207 (write-char #\space stream)
1208 (pprint-indent :current 0 stream)
1209 (funcall (formatter "~:<~@{~:<~^~W~^ ~@_~:I~W~@{ ~_~W~}~:>~^~:@_~}~:>")
1212 (pprint-exit-if-list-exhausted)
1213 (write-char #\space stream)
1214 (pprint-newline :linear stream)
1215 (pprint-linear stream (pprint-pop))
1216 (pprint-tagbody-guts stream)))
1218 (defun pprint-dolist (stream list &rest noise)
1219 (declare (ignore noise))
1220 (pprint-logical-block (stream list :prefix "(" :suffix ")")
1221 (pprint-exit-if-list-exhausted)
1222 (output-object (pprint-pop) stream)
1223 (pprint-exit-if-list-exhausted)
1224 (pprint-indent :block 3 stream)
1225 (write-char #\space stream)
1226 (pprint-newline :fill stream)
1227 (funcall (formatter "~:<~^~W~^ ~:_~:I~W~@{ ~_~W~}~:>")
1230 (pprint-tagbody-guts stream)))
1232 (defun pprint-typecase (stream list &rest noise)
1233 (declare (ignore noise))
1235 "~:<~^~W~^ ~3I~:_~W~1I~@{ ~_~:<~^~W~^~@{ ~_~W~}~:>~}~:>")
1239 (defun pprint-prog (stream list &rest noise)
1240 (declare (ignore noise))
1241 (pprint-logical-block (stream list :prefix "(" :suffix ")")
1242 (pprint-exit-if-list-exhausted)
1243 (output-object (pprint-pop) stream)
1244 (pprint-exit-if-list-exhausted)
1245 (write-char #\space stream)
1246 (pprint-newline :miser stream)
1247 (pprint-fill stream (pprint-pop))
1248 (pprint-tagbody-guts stream)))
1250 (defun pprint-fun-call (stream list &rest noise)
1251 (declare (ignore noise))
1252 (funcall (formatter "~:<~^~W~^ ~:_~:I~@{~W~^ ~_~}~:>")
1256 ;;;; the interface seen by regular (ugly) printer and initialization routines
1258 ;;; OUTPUT-PRETTY-OBJECT is called by OUTPUT-OBJECT when
1259 ;;; *PRINT-PRETTY* is true.
1260 (defun output-pretty-object (object stream)
1261 (with-pretty-stream (stream)
1262 (funcall (pprint-dispatch object) stream object)))
1264 (defun !pprint-cold-init ()
1265 (/show0 "entering !PPRINT-COLD-INIT")
1266 (setf *initial-pprint-dispatch* (make-pprint-dispatch-table))
1267 (let ((*print-pprint-dispatch* *initial-pprint-dispatch*)
1268 (*building-initial-table* t))
1269 ;; printers for regular types
1270 (/show0 "doing SET-PPRINT-DISPATCH for regular types")
1271 (set-pprint-dispatch 'array #'pprint-array)
1272 (set-pprint-dispatch '(cons symbol)
1273 #'pprint-fun-call -1)
1274 (set-pprint-dispatch 'cons #'pprint-fill -2)
1275 ;; cons cells with interesting things for the car
1276 (/show0 "doing SET-PPRINT-DISPATCH for CONS with interesting CAR")
1278 (dolist (magic-form '((lambda pprint-lambda)
1281 (block pprint-block)
1282 (catch pprint-block)
1283 (eval-when pprint-block)
1285 (function pprint-quote)
1286 (labels pprint-flet)
1289 (locally pprint-progn)
1290 (macrolet pprint-flet)
1291 (multiple-value-call pprint-block)
1292 (multiple-value-prog1 pprint-block)
1293 (progn pprint-progn)
1294 (progv pprint-progv)
1295 (quote pprint-quote)
1296 (return-from pprint-block)
1298 (symbol-macrolet pprint-let)
1299 (tagbody pprint-tagbody)
1300 (throw pprint-block)
1301 (unwind-protect pprint-block)
1306 (ctypecase pprint-typecase)
1307 (defconstant pprint-block)
1308 (define-modify-macro pprint-defun)
1309 (define-setf-expander pprint-defun)
1310 (defmacro pprint-defun)
1311 (defparameter pprint-block)
1312 (defsetf pprint-defun)
1313 (defstruct pprint-block)
1314 (deftype pprint-defun)
1315 (defun pprint-defun)
1316 (defvar pprint-block)
1317 (destructuring-bind pprint-destructuring-bind)
1320 (do-all-symbols pprint-dolist)
1321 (do-external-symbols pprint-dolist)
1322 (do-symbols pprint-dolist)
1323 (dolist pprint-dolist)
1324 (dotimes pprint-dolist)
1326 (etypecase pprint-typecase)
1327 #+nil (handler-bind ...)
1328 #+nil (handler-case ...)
1330 (multiple-value-bind pprint-progv)
1331 (multiple-value-setq pprint-block)
1332 (pprint-logical-block pprint-block)
1333 (print-unreadable-object pprint-block)
1336 (prog1 pprint-block)
1337 (prog2 pprint-progv)
1340 #+nil (restart-bind ...)
1341 #+nil (restart-case ...)
1345 (typecase pprint-typecase)
1346 (unless pprint-block)
1348 (with-compilation-unit pprint-block)
1349 #+nil (with-condition-restarts ...)
1350 (with-hash-table-iterator pprint-block)
1351 (with-input-from-string pprint-block)
1352 (with-open-file pprint-block)
1353 (with-open-stream pprint-block)
1354 (with-output-to-string pprint-block)
1355 (with-package-iterator pprint-block)
1356 (with-simple-restart pprint-block)
1357 (with-standard-io-syntax pprint-progn)))
1359 (set-pprint-dispatch `(cons (eql ,(first magic-form)))
1360 (symbol-function (second magic-form))))
1362 ;; other pretty-print init forms
1363 (/show0 "about to call !BACKQ-PP-COLD-INIT")
1364 (sb!impl::!backq-pp-cold-init)
1365 (/show0 "leaving !PPRINT-COLD-INIT"))
1367 (setf *print-pprint-dispatch* (copy-pprint-dispatch nil))
1368 (setf *print-pretty* t))