1 ;;;; miscellaneous VM definition noise for the x86-64
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 ;;; the size of an INTEGER representation of a SYSTEM-AREA-POINTER, i.e.
15 ;;; size of a native memory address
16 (deftype sap-int () '(unsigned-byte 64))
20 (eval-when (:compile-toplevel :load-toplevel :execute)
21 (defvar *byte-register-names* (make-array 32 :initial-element nil))
22 (defvar *word-register-names* (make-array 16 :initial-element nil))
23 (defvar *dword-register-names* (make-array 16 :initial-element nil))
24 (defvar *qword-register-names* (make-array 32 :initial-element nil))
25 (defvar *float-register-names* (make-array 16 :initial-element nil)))
27 (macrolet ((defreg (name offset size)
28 (let ((offset-sym (symbolicate name "-OFFSET"))
29 (names-vector (symbolicate "*" size "-REGISTER-NAMES*")))
31 (eval-when (:compile-toplevel :load-toplevel :execute)
32 ;; EVAL-WHEN is necessary because stuff like #.EAX-OFFSET
33 ;; (in the same file) depends on compile-time evaluation
34 ;; of the DEFCONSTANT. -- AL 20010224
35 (def!constant ,offset-sym ,offset))
36 (setf (svref ,names-vector ,offset-sym)
37 ,(symbol-name name)))))
38 ;; FIXME: It looks to me as though DEFREGSET should also
39 ;; define the related *FOO-REGISTER-NAMES* variable.
40 (defregset (name &rest regs)
41 `(eval-when (:compile-toplevel :load-toplevel :execute)
43 (list ,@(mapcar (lambda (name)
44 (symbolicate name "-OFFSET"))
49 ;; Note: the encoding here is different than that used by the chip.
50 ;; We use this encoding so that the compiler thinks that AX (and
51 ;; EAX) overlap AL and AH instead of AL and CL.
53 ;; High-byte are registers disabled on AMD64, since they can't be
54 ;; encoded for an op that has a REX-prefix and we don't want to
55 ;; add special cases into the code generation. The overlap doesn't
56 ;; therefore exist anymore, but the numbering hasn't been changed
66 (defreg r10b 20 :byte)
67 (defreg r11b 22 :byte)
68 (defreg r12b 24 :byte)
69 (defreg r13b 26 :byte)
70 (defreg r14b 28 :byte)
71 (defreg r15b 30 :byte)
72 (defregset *byte-regs*
73 al cl dl bl sil dil r8b r9b r10b
74 r11b #+nil r12b #+nil r13b r14b r15b)
85 (defregset *word-regs* ax cx dx bx si di)
87 ;; double word registers
93 (defreg ebp 10 :dword)
94 (defreg esi 12 :dword)
95 (defreg edi 14 :dword)
96 (defregset *dword-regs* eax ecx edx ebx esi edi)
100 (defreg rcx 2 :qword)
101 (defreg rdx 4 :qword)
102 (defreg rbx 6 :qword)
103 (defreg rsp 8 :qword)
104 (defreg rbp 10 :qword)
105 (defreg rsi 12 :qword)
106 (defreg rdi 14 :qword)
107 (defreg r8 16 :qword)
108 (defreg r9 18 :qword)
109 (defreg r10 20 :qword)
110 (defreg r11 22 :qword)
111 (defreg r12 24 :qword)
112 (defreg r13 26 :qword)
113 (defreg r14 28 :qword)
114 (defreg r15 30 :qword)
115 (defregset *qword-regs* rax rcx rdx rbx rsi rdi
116 r8 r9 r10 r11 #+nil r12 #+nil r13 r14 r15)
118 ;; floating point registers
119 (defreg float0 0 :float)
120 (defreg float1 1 :float)
121 (defreg float2 2 :float)
122 (defreg float3 3 :float)
123 (defreg float4 4 :float)
124 (defreg float5 5 :float)
125 (defreg float6 6 :float)
126 (defreg float7 7 :float)
127 (defreg float8 8 :float)
128 (defreg float9 9 :float)
129 (defreg float10 10 :float)
130 (defreg float11 11 :float)
131 (defreg float12 12 :float)
132 (defreg float13 13 :float)
133 (defreg float14 14 :float)
134 (defreg float15 15 :float)
135 (defregset *float-regs* float0 float1 float2 float3 float4 float5 float6 float7
136 float8 float9 float10 float11 float12 float13 float14 float15)
138 ;; registers used to pass arguments
140 ;; the number of arguments/return values passed in registers
141 (def!constant register-arg-count 3)
142 ;; names and offsets for registers used to pass arguments
143 (eval-when (:compile-toplevel :load-toplevel :execute)
144 (defparameter *register-arg-names* '(rdx rdi rsi)))
145 (defregset *register-arg-offsets* rdx rdi rsi)
146 (defregset *c-call-register-arg-offsets* rdi rsi rdx rcx r8 r9))
150 ;;; There are 16 registers really, but we consider them 32 in order to
151 ;;; describe the overlap of byte registers. The only thing we need to
152 ;;; represent is what registers overlap. Therefore, we consider bytes
153 ;;; to take one unit, and [dq]?words to take two. We don't need to
154 ;;; tell the difference between [dq]?words, because you can't put two
155 ;;; words in a dword register.
156 (define-storage-base registers :finite :size 32)
158 (define-storage-base float-registers :finite :size 16)
160 (define-storage-base stack :unbounded :size 8)
161 (define-storage-base constant :non-packed)
162 (define-storage-base immediate-constant :non-packed)
163 (define-storage-base noise :unbounded :size 2)
167 ;;; a handy macro so we don't have to keep changing all the numbers whenever
168 ;;; we insert a new storage class
170 (defmacro !define-storage-classes (&rest classes)
173 (dolist (class classes)
174 (let* ((sc-name (car class))
175 (constant-name (symbolicate sc-name "-SC-NUMBER")))
176 (forms `(define-storage-class ,sc-name ,index
178 (forms `(def!constant ,constant-name ,index))
183 ;;; The DEFINE-STORAGE-CLASS call for CATCH-BLOCK refers to the size
184 ;;; of CATCH-BLOCK. The size of CATCH-BLOCK isn't calculated until
185 ;;; later in the build process, and the calculation is entangled with
186 ;;; code which has lots of predependencies, including dependencies on
187 ;;; the prior call of DEFINE-STORAGE-CLASS. The proper way to
188 ;;; unscramble this would be to untangle the code, so that the code
189 ;;; which calculates the size of CATCH-BLOCK can be separated from the
190 ;;; other lots-of-dependencies code, so that the code which calculates
191 ;;; the size of CATCH-BLOCK can be executed early, so that this value
192 ;;; is known properly at this point in compilation. However, that
193 ;;; would be a lot of editing of code that I (WHN 19990131) can't test
194 ;;; until the project is complete. So instead, I set the correct value
195 ;;; by hand here (a sort of nondeterministic guess of the right
196 ;;; answer:-) and add an assertion later, after the value is
197 ;;; calculated, that the original guess was correct.
199 ;;; (What a KLUDGE! Anyone who wants to come in and clean up this mess
200 ;;; has my gratitude.) (FIXME: Maybe this should be me..)
201 (eval-when (:compile-toplevel :load-toplevel :execute)
202 (def!constant kludge-nondeterministic-catch-block-size 6))
204 (!define-storage-classes
206 ;; non-immediate constants in the constant pool
209 (fp-single-zero immediate-constant)
210 (fp-double-zero immediate-constant)
212 (immediate immediate-constant)
219 (control-stack stack) ; may be pointers, scanned by GC
221 ;; the non-descriptor stacks
222 ;; XXX alpha backend has :element-size 2 :alignment 2 in these entries
223 (signed-stack stack) ; (signed-byte 32)
224 (unsigned-stack stack) ; (unsigned-byte 32)
225 (character-stack stack) ; non-descriptor characters.
226 (sap-stack stack) ; System area pointers.
227 (single-stack stack) ; single-floats
229 (complex-single-stack stack :element-size 2) ; complex-single-floats
230 (complex-double-stack stack :element-size 2) ; complex-double-floats
240 ;; things that can go in the integer registers
243 ;; On the X86, we don't have to distinguish between descriptor and
244 ;; non-descriptor registers, because of the conservative GC.
245 ;; Therefore, we use different scs only to distinguish between
246 ;; descriptor and non-descriptor values and to specify size.
248 ;; immediate descriptor objects. Don't have to be seen by GC, but nothing
249 ;; bad will happen if they are. (fixnums, characters, header values, etc).
251 :locations #.*qword-regs*
252 :element-size 2 ; I think this is for the al/ah overlap thing
253 :constant-scs (immediate)
255 :alternate-scs (control-stack))
257 ;; pointer descriptor objects -- must be seen by GC
258 (descriptor-reg registers
259 :locations #.*qword-regs*
261 ; :reserve-locations (#.eax-offset)
262 :constant-scs (constant immediate)
264 :alternate-scs (control-stack))
266 ;; non-descriptor characters
267 (character-reg registers
268 :locations #!-sb-unicode #.*byte-regs*
269 #!+sb-unicode #.*qword-regs*
270 #!-sb-unicode #!-sb-unicode
271 :reserve-locations (#.al-offset)
272 :constant-scs (immediate)
274 :alternate-scs (character-stack))
276 ;; non-descriptor SAPs (arbitrary pointers into address space)
278 :locations #.*qword-regs*
280 ; :reserve-locations (#.eax-offset)
281 :constant-scs (immediate)
283 :alternate-scs (sap-stack))
285 ;; non-descriptor (signed or unsigned) numbers
286 (signed-reg registers
287 :locations #.*qword-regs*
289 :constant-scs (immediate)
291 :alternate-scs (signed-stack))
292 (unsigned-reg registers
293 :locations #.*qword-regs*
295 :constant-scs (immediate)
297 :alternate-scs (unsigned-stack))
299 ;; miscellaneous objects that must not be seen by GC. Used only as
302 :locations #.*word-regs*
306 :locations #.*dword-regs*
310 :locations #.*byte-regs*
313 ;; that can go in the floating point registers
315 ;; non-descriptor SINGLE-FLOATs
316 (single-reg float-registers
317 :locations #.(loop for i from 0 below 15 collect i)
318 :constant-scs (fp-single-zero)
320 :alternate-scs (single-stack))
322 ;; non-descriptor DOUBLE-FLOATs
323 (double-reg float-registers
324 :locations #.(loop for i from 0 below 15 collect i)
325 :constant-scs (fp-double-zero)
327 :alternate-scs (double-stack))
329 (complex-single-reg float-registers
330 :locations #.(loop for i from 0 to 14 by 2 collect i)
334 :alternate-scs (complex-single-stack))
336 (complex-double-reg float-registers
337 :locations #.(loop for i from 0 to 14 by 2 collect i)
341 :alternate-scs (complex-double-stack))
343 ;; a catch or unwind block
344 (catch-block stack :element-size kludge-nondeterministic-catch-block-size))
346 (eval-when (:compile-toplevel :load-toplevel :execute)
347 (defparameter *byte-sc-names*
348 '(#!-sb-unicode character-reg byte-reg #!-sb-unicode character-stack))
349 (defparameter *word-sc-names* '(word-reg))
350 (defparameter *dword-sc-names* '(dword-reg))
351 (defparameter *qword-sc-names*
352 '(any-reg descriptor-reg sap-reg signed-reg unsigned-reg control-stack
353 signed-stack unsigned-stack sap-stack single-stack
354 #!+sb-unicode character-reg #!+sb-unicode character-stack constant))
355 ;;; added by jrd. I guess the right thing to do is to treat floats
356 ;;; as a separate size...
358 ;;; These are used to (at least) determine operand size.
359 (defparameter *float-sc-names* '(single-reg))
360 (defparameter *double-sc-names* '(double-reg double-stack))
363 ;;;; miscellaneous TNs for the various registers
365 (macrolet ((def-misc-reg-tns (sc-name &rest reg-names)
367 (dolist (reg-name reg-names)
368 (let ((tn-name (symbolicate reg-name "-TN"))
369 (offset-name (symbolicate reg-name "-OFFSET")))
370 ;; FIXME: It'd be good to have the special
371 ;; variables here be named with the *FOO*
373 (forms `(defparameter ,tn-name
374 (make-random-tn :kind :normal
375 :sc (sc-or-lose ',sc-name)
378 `(progn ,@(forms)))))
380 (def-misc-reg-tns unsigned-reg rax rbx rcx rdx rbp rsp rdi rsi
381 r8 r9 r10 r11 r12 r13 r14 r15)
382 (def-misc-reg-tns dword-reg eax ebx ecx edx ebp esp edi esi)
383 (def-misc-reg-tns word-reg ax bx cx dx bp sp di si)
384 (def-misc-reg-tns byte-reg al cl dl bl sil dil r8b r9b r10b
386 (def-misc-reg-tns single-reg
387 float0 float1 float2 float3 float4 float5 float6 float7
388 float8 float9 float10 float11 float12 float13 float14 float15))
390 ;;; TNs for registers used to pass arguments
391 (defparameter *register-arg-tns*
392 (mapcar (lambda (register-arg-name)
393 (symbol-value (symbolicate register-arg-name "-TN")))
394 *register-arg-names*))
397 (defparameter fp-single-zero-tn
398 (make-random-tn :kind :normal
399 :sc (sc-or-lose 'single-reg)
402 (defparameter fp-double-zero-tn
403 (make-random-tn :kind :normal
404 :sc (sc-or-lose 'double-reg)
407 ;;; If value can be represented as an immediate constant, then return
408 ;;; the appropriate SC number, otherwise return NIL.
409 (!def-vm-support-routine immediate-constant-sc (value)
411 ((or (integer #.sb!xc:most-negative-fixnum #.sb!xc:most-positive-fixnum)
412 #-sb-xc-host system-area-pointer character)
413 (sc-number-or-lose 'immediate))
415 (when (static-symbol-p value)
416 (sc-number-or-lose 'immediate)))
419 (sc-number-or-lose 'fp-single-zero )
423 (sc-number-or-lose 'fp-double-zero )
427 ;;;; miscellaneous function call parameters
429 ;;; offsets of special stack frame locations
430 (def!constant ocfp-save-offset 0)
431 (def!constant return-pc-save-offset 1)
432 (def!constant code-save-offset 2)
434 (def!constant lra-save-offset return-pc-save-offset) ; ?
436 ;;; This is used by the debugger.
437 (def!constant single-value-return-byte-offset 3)
439 ;;; This function is called by debug output routines that want a pretty name
440 ;;; for a TN's location. It returns a thing that can be printed with PRINC.
441 (!def-vm-support-routine location-print-name (tn)
442 (declare (type tn tn))
443 (let* ((sc (tn-sc tn))
444 (sb (sb-name (sc-sb sc)))
445 (offset (tn-offset tn)))
448 (let* ((sc-name (sc-name sc))
449 (name-vec (cond ((member sc-name *byte-sc-names*)
450 *byte-register-names*)
451 ((member sc-name *word-sc-names*)
452 *word-register-names*)
453 ((member sc-name *dword-sc-names*)
454 *dword-register-names*)
455 ((member sc-name *qword-sc-names*)
456 *qword-register-names*))))
458 (< -1 offset (length name-vec))
459 (svref name-vec offset))
460 ;; FIXME: Shouldn't this be an ERROR?
461 (format nil "<unknown reg: off=~W, sc=~A>" offset sc-name))))
462 (float-registers (format nil "FLOAT~D" offset))
463 (stack (format nil "S~D" offset))
464 (constant (format nil "Const~D" offset))
465 (immediate-constant "Immed")
466 (noise (symbol-name (sc-name sc))))))
467 ;;; FIXME: Could this, and everything that uses it, be made #!+SB-SHOW?
469 (defun dwords-for-quad (value)
470 (let* ((lo (logand value (1- (ash 1 32))))
471 (hi (ash value -32)))
474 (defun words-for-dword (value)
475 (let* ((lo (logand value (1- (ash 1 16))))
476 (hi (ash value -16)))
479 (def!constant cfp-offset rbp-offset) ; pfw - needed by stuff in /code