1 ;;;; various useful macros for generating Alpha code
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.
14 ;;; a handy macro for defining top-level forms that depend on the
15 ;;; compile environment
16 (defmacro expand (expr)
17 (let ((gensym (gensym)))
23 ;;; instruction-like macros
26 ;;(defmacro move (dst src)
28 ;; "Move SRC into DST unless they are location=."
29 ;; (once-only ((n-dst dst)
31 ;; `(unless (location= ,n-dst ,n-src)
32 ;; (inst mov ,n-dst ,n-src))))
34 (defmacro move (src dst)
35 "Move SRC into DST unless they are location=."
36 (once-only ((n-src src) (n-dst dst))
37 `(unless (location= ,n-src ,n-dst)
38 (inst move ,n-src ,n-dst))))
40 (defmacro loadw (result base &optional (offset 0) (lowtag 0))
41 (once-only ((result result) (base base))
42 `(inst ldl ,result (- (ash ,offset word-shift) ,lowtag) ,base)))
44 (defmacro loadq (result base &optional (offset 0) (lowtag 0))
45 (once-only ((result result) (base base))
46 `(inst ldq ,result (- (ash ,offset word-shift) ,lowtag) ,base)))
48 (defmacro storew (value base &optional (offset 0) (lowtag 0))
49 (once-only ((value value) (base base) (offset offset) (lowtag lowtag))
50 `(inst stl ,value (- (ash ,offset word-shift) ,lowtag) ,base)))
52 (defmacro storeq (value base &optional (offset 0) (lowtag 0))
53 (once-only ((value value) (base base) (offset offset) (lowtag lowtag))
54 `(inst stq ,value (- (ash ,offset word-shift) ,lowtag) ,base)))
56 (defmacro load-symbol (reg symbol)
57 (once-only ((reg reg) (symbol symbol))
58 `(inst lda ,reg (static-symbol-offset ,symbol) null-tn)))
60 (defmacro load-symbol-value (reg symbol)
62 (+ (static-symbol-offset ',symbol)
63 (ash symbol-value-slot word-shift)
64 (- other-pointer-lowtag))
67 (defmacro store-symbol-value (reg symbol)
69 (+ (static-symbol-offset ',symbol)
70 (ash symbol-value-slot word-shift)
71 (- other-pointer-lowtag))
74 (defmacro load-type (target source &optional (offset 0))
75 "Loads the type bits of a pointer into target independent of
76 byte-ordering issues."
77 (once-only ((n-target target)
81 (inst ldl ,n-target ,n-offset ,n-source)
82 (inst and ,n-target #xff ,n-target))))
84 ;;; macros to handle the fact that we cannot use the machine native
85 ;;; call and return instructions
87 (defmacro lisp-jump (function lip)
88 "Jump to the lisp function FUNCTION. LIP is an interior-reg temporary."
90 (inst lda ,lip (- (ash sb!vm:simple-fun-code-offset sb!vm:word-shift)
91 sb!vm:fun-pointer-lowtag)
93 (move ,function code-tn)
94 (inst jsr zero-tn ,lip 1)))
96 (defmacro lisp-return (return-pc lip &key (offset 0) (frob-code t))
97 "Return to RETURN-PC. LIP is an interior-reg temporary."
100 (- (* (1+ ,offset) n-word-bytes) other-pointer-lowtag)
103 `((move ,return-pc code-tn)))
104 (inst ret zero-tn ,lip 1)))
107 (defmacro emit-return-pc (label)
108 "Emit a return-pc header word. LABEL is the label to use for this
111 (align n-lowtag-bits)
113 (inst lra-header-word)))
119 ;;; Move a stack TN to a register and vice-versa.
120 (defmacro load-stack-tn (reg stack)
123 (let ((offset (tn-offset stack)))
126 (loadw reg cfp-tn offset))))))
127 (defmacro store-stack-tn (stack reg)
128 `(let ((stack ,stack)
130 (let ((offset (tn-offset stack)))
133 (storew reg cfp-tn offset))))))
135 ;;; Move the TN Reg-Or-Stack into Reg if it isn't already there.
136 (defmacro maybe-load-stack-tn (reg reg-or-stack)
137 (once-only ((n-reg reg)
138 (n-stack reg-or-stack))
140 ((any-reg descriptor-reg)
142 ((any-reg descriptor-reg)
143 (move ,n-stack ,n-reg))
145 (loadw ,n-reg cfp-tn (tn-offset ,n-stack))))))))
147 ;;; Move the TN Reg-Or-Stack into Reg if it isn't already there.
148 (defmacro maybe-load-stack-nfp-tn (reg reg-or-stack temp)
149 (once-only ((n-reg reg)
150 (n-stack reg-or-stack))
153 ((any-reg descriptor-reg)
155 ((any-reg descriptor-reg)
156 (move ,n-stack ,n-reg))
158 (loadw ,n-reg cfp-tn (tn-offset ,n-stack))
159 (inst mskll nsp-tn 0 ,temp)
160 (inst bis ,temp ,n-reg ,n-reg))))))))
162 ;;;; storage allocation
164 ;;; Do stuff to allocate an other-pointer object of fixed SIZE with a
165 ;;; single word header having the specified WIDETAG value. The result is
166 ;;; placed in RESULT-TN, Flag-Tn must be wired to NL3-OFFSET, and
167 ;;; Temp-TN is a non- descriptor temp (which may be randomly used by
168 ;;; the body.) The body is placed inside the PSEUDO-ATOMIC, and
169 ;;; presumably initializes the object.
170 (defmacro with-fixed-allocation ((result-tn temp-tn widetagsize)
172 `(pseudo-atomic (:extra (pad-data-block ,size))
173 (inst bis alloc-tn other-pointer-lowtag ,result-tn)
174 (inst li (logior (ash (1- ,size) n-widetag-bits) ,widetag) ,temp-tn)
175 (storew ,temp-tn ,result-tn 0 other-pointer-lowtag)
180 (defvar *adjustable-vectors* nil)
182 (defmacro with-adjustable-vector ((var) &rest body)
183 `(let ((,var (or (pop *adjustable-vectors*)
185 :element-type '(unsigned-byte 8)
188 (setf (fill-pointer ,var) 0)
192 (push ,var *adjustable-vectors*))))
194 (eval-when (:compile-toplevel :load-toplevel :execute)
195 (defun emit-error-break (vop kind code values)
196 (let ((vector (gensym)))
199 (note-this-location vop :internal-error)))
201 (with-adjustable-vector (,vector)
202 (write-var-integer (error-number-or-lose ',code) ,vector)
203 ,@(mapcar #'(lambda (tn)
205 (write-var-integer (make-sc-offset (sc-number
210 (inst byte (length ,vector))
211 (dotimes (i (length ,vector))
212 (inst byte (aref ,vector i))))
213 (align word-shift)))))
215 (defmacro error-call (vop error-code &rest values)
216 "Cause an error. ERROR-CODE is the error to cause."
218 (emit-error-break vop error-trap error-code values)))
221 (defmacro cerror-call (vop label error-code &rest values)
222 "Cause a continuable error. If the error is continued, execution resumes at
225 (inst br zero-tn ,label)
226 ,@(emit-error-break vop cerror-trap error-code values)))
228 (defmacro generate-error-code (vop error-code &rest values)
229 "Generate-Error-Code Error-code Value*
230 Emit code for an error with the specified Error-Code and context Values."
231 `(assemble (*elsewhere*)
232 (let ((start-lab (gen-label)))
233 (emit-label start-lab)
234 (error-call ,vop ,error-code ,@values)
237 (defmacro generate-cerror-code (vop error-code &rest values)
238 "Generate-CError-Code Error-code Value*
239 Emit code for a continuable error with the specified Error-Code and
240 context Values. If the error is continued, execution resumes after
241 the GENERATE-CERROR-CODE form."
242 (let ((continue (gensym "CONTINUE-LABEL-"))
243 (error (gensym "ERROR-LABEL-")))
244 `(let ((,continue (gen-label)))
245 (emit-label ,continue)
246 (assemble (*elsewhere*)
247 (let ((,error (gen-label)))
249 (cerror-call ,vop ,continue ,error-code ,@values)
253 ;;; PSEUDO-ATOMIC -- Handy macro for making sequences look atomic.
255 (defmacro pseudo-atomic ((&key (extra 0)) &rest forms)
257 (inst addq alloc-tn 1 alloc-tn)
259 (inst lda alloc-tn (1- ,extra) alloc-tn)
260 (inst stl zero-tn 0 alloc-tn)))
264 ;;;; Memory accessor vop generators
266 (deftype load/store-index (scale lowtag min-offset
267 &optional (max-offset min-offset))
268 `(integer ,(- (truncate (+ (ash 1 16)
269 (* min-offset n-word-bytes)
272 ,(truncate (- (+ (1- (ash 1 16)) lowtag)
273 (* max-offset n-word-bytes))
276 (defmacro define-full-reffer (name type offset lowtag scs el-type
281 `((:translate ,translate)))
283 (:args (object :scs (descriptor-reg))
284 (index :scs (any-reg)))
285 (:arg-types ,type tagged-num)
286 (:temporary (:scs (interior-reg)) lip)
287 (:results (value :scs ,scs))
288 (:result-types ,el-type)
290 (inst addq object index lip)
291 (inst ldl value (- (* ,offset n-word-bytes) ,lowtag) lip)
292 ,@(when (equal scs '(unsigned-reg))
293 '((inst mskll value 4 value)))))
294 (define-vop (,(symbolicate name "-C"))
296 `((:translate ,translate)))
298 (:args (object :scs (descriptor-reg)))
301 (:constant (load/store-index ,n-word-bytes ,(eval lowtag)
303 (:results (value :scs ,scs))
304 (:result-types ,el-type)
306 (inst ldl value (- (* (+ ,offset index) n-word-bytes) ,lowtag)
308 ,@(when (equal scs '(unsigned-reg))
309 '((inst mskll value 4 value)))))))
311 (defmacro define-full-setter (name type offset lowtag scs el-type
312 &optional translate #+gengc (remember t))
316 `((:translate ,translate)))
318 (:args (object :scs (descriptor-reg))
319 (index :scs (any-reg))
320 (value :scs ,scs :target result))
321 (:arg-types ,type tagged-num ,el-type)
322 (:temporary (:scs (interior-reg)) lip)
323 (:results (result :scs ,scs))
324 (:result-types ,el-type)
326 (inst addq index object lip)
327 (inst stl value (- (* ,offset n-word-bytes) ,lowtag) lip)
328 (move value result)))
329 (define-vop (,(symbolicate name "-C"))
331 `((:translate ,translate)))
333 (:args (object :scs (descriptor-reg))
337 (:constant (load/store-index ,n-word-bytes ,(eval lowtag)
340 (:results (result :scs ,scs))
341 (:result-types ,el-type)
343 (inst stl value (- (* (+ ,offset index) n-word-bytes) ,lowtag)
345 (move value result)))))
348 (defmacro define-partial-reffer (name type size signed offset lowtag scs
349 el-type &optional translate)
350 (let ((scale (ecase size (:byte 1) (:short 2))))
354 `((:translate ,translate)))
356 (:args (object :scs (descriptor-reg))
357 (index :scs (unsigned-reg)))
358 (:arg-types ,type positive-fixnum)
359 (:results (value :scs ,scs))
360 (:result-types ,el-type)
361 (:temporary (:scs (interior-reg)) lip)
362 (:temporary (:sc non-descriptor-reg) temp)
363 (:temporary (:sc non-descriptor-reg) temp1)
365 (inst addq object index lip)
366 ,@(when (eq size :short)
367 '((inst addq index lip lip)))
371 `((inst ldq_u temp (- (* ,offset n-word-bytes) ,lowtag)
373 (inst lda temp1 (1+ (- (* ,offset n-word-bytes) ,lowtag))
375 (inst extqh temp temp1 temp)
376 (inst sra temp 56 value))
379 (- (* ,offset n-word-bytes) ,lowtag)
381 (inst lda temp1 (- (* ,offset n-word-bytes) ,lowtag)
383 (inst extbl temp temp1 value))))
386 `((inst ldq_u temp (- (* ,offset n-word-bytes) ,lowtag)
388 (inst lda temp1 (- (* ,offset n-word-bytes) ,lowtag)
390 (inst extwl temp temp1 temp)
391 (inst sll temp 48 temp)
392 (inst sra temp 48 value))
393 `((inst ldq_u temp (- (* ,offset n-word-bytes) ,lowtag)
395 (inst lda temp1 (- (* ,offset n-word-bytes) ,lowtag) lip)
396 (inst extwl temp temp1 value)))))))
397 (define-vop (,(symbolicate name "-C"))
399 `((:translate ,translate)))
401 (:args (object :scs (descriptor-reg)))
404 (:constant (load/store-index ,scale
407 (:results (value :scs ,scs))
408 (:result-types ,el-type)
409 (:temporary (:sc non-descriptor-reg) temp)
410 (:temporary (:sc non-descriptor-reg) temp1)
415 `((inst ldq_u temp (- (+ (* ,offset n-word-bytes)
416 (* index ,scale)) ,lowtag)
418 (inst lda temp1 (1+ (- (+ (* ,offset n-word-bytes)
419 (* index ,scale)) ,lowtag))
421 (inst extqh temp temp1 temp)
422 (inst sra temp 56 value))
423 `((inst ldq_u temp (- (+ (* ,offset n-word-bytes)
424 (* index ,scale)) ,lowtag)
426 (inst lda temp1 (- (+ (* ,offset n-word-bytes)
427 (* index ,scale)) ,lowtag)
429 (inst extbl temp temp1 value))))
432 `((inst ldq_u temp (- (+ (* ,offset n-word-bytes)
433 (* index ,scale)) ,lowtag)
435 (inst lda temp1 (- (+ (* ,offset n-word-bytes)
436 (* index ,scale)) ,lowtag)
438 (inst extwl temp temp1 temp)
439 (inst sll temp 48 temp)
440 (inst sra temp 48 value))
441 `((inst ldq_u temp (- (+ (* ,offset n-word-bytes)
442 (* index ,scale)) ,lowtag)
444 (inst lda temp1 (- (+ (* ,offset n-word-bytes)
445 (* index ,scale)) ,lowtag)
447 (inst extwl temp temp1 value))))))))))
449 (defmacro define-partial-setter (name type size offset lowtag scs el-type
451 (let ((scale (ecase size (:byte 1) (:short 2))))
455 `((:translate ,translate)))
457 (:args (object :scs (descriptor-reg))
458 (index :scs (unsigned-reg))
459 (value :scs ,scs :target result))
460 (:arg-types ,type positive-fixnum ,el-type)
461 (:temporary (:scs (interior-reg)) lip)
462 (:temporary (:sc non-descriptor-reg) temp)
463 (:temporary (:sc non-descriptor-reg) temp1)
464 (:temporary (:sc non-descriptor-reg) temp2)
465 (:results (result :scs ,scs))
466 (:result-types ,el-type)
468 (inst addq object index lip)
469 ,@(when (eq size :short)
470 '((inst addq lip index lip)))
473 `((inst lda temp (- (* ,offset n-word-bytes) ,lowtag) lip)
474 (inst ldq_u temp1 (- (* ,offset n-word-bytes) ,lowtag) lip)
475 (inst insbl value temp temp2)
476 (inst mskbl temp1 temp temp1)
477 (inst bis temp1 temp2 temp1)
478 (inst stq_u temp1 (- (* ,offset n-word-bytes) ,lowtag) lip)))
480 `((inst lda temp (- (* ,offset n-word-bytes) ,lowtag) lip)
481 (inst ldq_u temp1 (- (* ,offset n-word-bytes) ,lowtag) lip)
482 (inst mskwl temp1 temp temp1)
483 (inst inswl value temp temp2)
484 (inst bis temp1 temp2 temp)
485 (inst stq_u temp (- (* ,offset n-word-bytes) ,lowtag) lip))))
486 (move value result)))
487 (define-vop (,(symbolicate name "-C"))
489 `((:translate ,translate)))
491 (:args (object :scs (descriptor-reg))
492 (value :scs ,scs :target result))
495 (:constant (load/store-index ,scale
499 (:temporary (:sc non-descriptor-reg) temp)
500 (:temporary (:sc non-descriptor-reg) temp1)
501 (:temporary (:sc non-descriptor-reg) temp2)
502 (:results (result :scs ,scs))
503 (:result-types ,el-type)
507 `((inst lda temp (- (* ,offset n-word-bytes)
508 (* index ,scale) ,lowtag)
510 (inst ldq_u temp1 (- (* ,offset n-word-bytes)
511 (* index ,scale) ,lowtag)
513 (inst insbl value temp temp2)
514 (inst mskbl temp1 temp temp1)
515 (inst bis temp1 temp2 temp1)
516 (inst stq_u temp1 (- (* ,offset n-word-bytes)
517 (* index ,scale) ,lowtag) object)))
519 `((inst lda temp (- (* ,offset n-word-bytes)
520 (* index ,scale) ,lowtag)
522 (inst ldq_u temp1 (- (* ,offset n-word-bytes)
523 (* index ,scale) ,lowtag)
525 (inst mskwl temp1 temp temp1)
526 (inst inswl value temp temp2)
527 (inst bis temp1 temp2 temp)
528 (inst stq_u temp (- (* ,offset n-word-bytes)
529 (* index ,scale) ,lowtag) object))))
530 (move value result))))))