1 /* Low level packing and unpacking of values for GDB, the GNU Debugger.
3 Copyright (C) 1986, 1987, 1988, 1989, 1990, 1991, 1992, 1993, 1994, 1995,
4 1996, 1997, 1998, 1999, 2000, 2002, 2003, 2004, 2005, 2006, 2007, 2008,
5 2009, 2010, 2011 Free Software Foundation, Inc.
7 This file is part of GDB.
9 This program is free software; you can redistribute it and/or modify
10 it under the terms of the GNU General Public License as published by
11 the Free Software Foundation; either version 3 of the License, or
12 (at your option) any later version.
14 This program is distributed in the hope that it will be useful,
15 but WITHOUT ANY WARRANTY; without even the implied warranty of
16 MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
17 GNU General Public License for more details.
19 You should have received a copy of the GNU General Public License
20 along with this program. If not, see <http://www.gnu.org/licenses/>. */
23 #include "arch-utils.h"
24 #include "gdb_string.h"
35 #include "gdb_assert.h"
41 #include "cli/cli-decode.h"
42 #include "exceptions.h"
43 #include "python/python.h"
45 #include "tracepoint.h"
47 /* Prototypes for exported functions. */
49 void _initialize_values (void);
51 /* Definition of a user function. */
52 struct internal_function
54 /* The name of the function. It is a bit odd to have this in the
55 function itself -- the user might use a differently-named
56 convenience variable to hold the function. */
60 internal_function_fn handler;
62 /* User data for the handler. */
66 /* Defines an [OFFSET, OFFSET + LENGTH) range. */
70 /* Lowest offset in the range. */
73 /* Length of the range. */
77 typedef struct range range_s;
81 /* Returns true if the ranges defined by [offset1, offset1+len1) and
82 [offset2, offset2+len2) overlap. */
85 ranges_overlap (int offset1, int len1,
86 int offset2, int len2)
90 l = max (offset1, offset2);
91 h = min (offset1 + len1, offset2 + len2);
95 /* Returns true if the first argument is strictly less than the
96 second, useful for VEC_lower_bound. We keep ranges sorted by
97 offset and coalesce overlapping and contiguous ranges, so this just
98 compares the starting offset. */
101 range_lessthan (const range_s *r1, const range_s *r2)
103 return r1->offset < r2->offset;
106 /* Returns true if RANGES contains any range that overlaps [OFFSET,
110 ranges_contain (VEC(range_s) *ranges, int offset, int length)
115 what.offset = offset;
116 what.length = length;
118 /* We keep ranges sorted by offset and coalesce overlapping and
119 contiguous ranges, so to check if a range list contains a given
120 range, we can do a binary search for the position the given range
121 would be inserted if we only considered the starting OFFSET of
122 ranges. We call that position I. Since we also have LENGTH to
123 care for (this is a range afterall), we need to check if the
124 _previous_ range overlaps the I range. E.g.,
128 |---| |---| |------| ... |--|
133 In the case above, the binary search would return `I=1', meaning,
134 this OFFSET should be inserted at position 1, and the current
135 position 1 should be pushed further (and before 2). But, `0'
138 Then we need to check if the I range overlaps the I range itself.
143 |---| |---| |-------| ... |--|
149 i = VEC_lower_bound (range_s, ranges, &what, range_lessthan);
153 struct range *bef = VEC_index (range_s, ranges, i - 1);
155 if (ranges_overlap (bef->offset, bef->length, offset, length))
159 if (i < VEC_length (range_s, ranges))
161 struct range *r = VEC_index (range_s, ranges, i);
163 if (ranges_overlap (r->offset, r->length, offset, length))
170 static struct cmd_list_element *functionlist;
174 /* Type of value; either not an lval, or one of the various
175 different possible kinds of lval. */
178 /* Is it modifiable? Only relevant if lval != not_lval. */
181 /* Location of value (if lval). */
184 /* If lval == lval_memory, this is the address in the inferior.
185 If lval == lval_register, this is the byte offset into the
186 registers structure. */
189 /* Pointer to internal variable. */
190 struct internalvar *internalvar;
192 /* If lval == lval_computed, this is a set of function pointers
193 to use to access and describe the value, and a closure pointer
197 struct lval_funcs *funcs; /* Functions to call. */
198 void *closure; /* Closure for those functions to use. */
202 /* Describes offset of a value within lval of a structure in bytes.
203 If lval == lval_memory, this is an offset to the address. If
204 lval == lval_register, this is a further offset from
205 location.address within the registers structure. Note also the
206 member embedded_offset below. */
209 /* Only used for bitfields; number of bits contained in them. */
212 /* Only used for bitfields; position of start of field. For
213 gdbarch_bits_big_endian=0 targets, it is the position of the LSB. For
214 gdbarch_bits_big_endian=1 targets, it is the position of the MSB. */
217 /* Only used for bitfields; the containing value. This allows a
218 single read from the target when displaying multiple
220 struct value *parent;
222 /* Frame register value is relative to. This will be described in
223 the lval enum above as "lval_register". */
224 struct frame_id frame_id;
226 /* Type of the value. */
229 /* If a value represents a C++ object, then the `type' field gives
230 the object's compile-time type. If the object actually belongs
231 to some class derived from `type', perhaps with other base
232 classes and additional members, then `type' is just a subobject
233 of the real thing, and the full object is probably larger than
234 `type' would suggest.
236 If `type' is a dynamic class (i.e. one with a vtable), then GDB
237 can actually determine the object's run-time type by looking at
238 the run-time type information in the vtable. When this
239 information is available, we may elect to read in the entire
240 object, for several reasons:
242 - When printing the value, the user would probably rather see the
243 full object, not just the limited portion apparent from the
246 - If `type' has virtual base classes, then even printing `type'
247 alone may require reaching outside the `type' portion of the
248 object to wherever the virtual base class has been stored.
250 When we store the entire object, `enclosing_type' is the run-time
251 type -- the complete object -- and `embedded_offset' is the
252 offset of `type' within that larger type, in bytes. The
253 value_contents() macro takes `embedded_offset' into account, so
254 most GDB code continues to see the `type' portion of the value,
255 just as the inferior would.
257 If `type' is a pointer to an object, then `enclosing_type' is a
258 pointer to the object's run-time type, and `pointed_to_offset' is
259 the offset in bytes from the full object to the pointed-to object
260 -- that is, the value `embedded_offset' would have if we followed
261 the pointer and fetched the complete object. (I don't really see
262 the point. Why not just determine the run-time type when you
263 indirect, and avoid the special case? The contents don't matter
264 until you indirect anyway.)
266 If we're not doing anything fancy, `enclosing_type' is equal to
267 `type', and `embedded_offset' is zero, so everything works
269 struct type *enclosing_type;
271 int pointed_to_offset;
273 /* Values are stored in a chain, so that they can be deleted easily
274 over calls to the inferior. Values assigned to internal
275 variables, put into the value history or exposed to Python are
276 taken off this list. */
279 /* Register number if the value is from a register. */
282 /* If zero, contents of this value are in the contents field. If
283 nonzero, contents are in inferior. If the lval field is lval_memory,
284 the contents are in inferior memory at location.address plus offset.
285 The lval field may also be lval_register.
287 WARNING: This field is used by the code which handles watchpoints
288 (see breakpoint.c) to decide whether a particular value can be
289 watched by hardware watchpoints. If the lazy flag is set for
290 some member of a value chain, it is assumed that this member of
291 the chain doesn't need to be watched as part of watching the
292 value itself. This is how GDB avoids watching the entire struct
293 or array when the user wants to watch a single struct member or
294 array element. If you ever change the way lazy flag is set and
295 reset, be sure to consider this use as well! */
298 /* If nonzero, this is the value of a variable which does not
299 actually exist in the program. */
302 /* If value is a variable, is it initialized or not. */
305 /* If value is from the stack. If this is set, read_stack will be
306 used instead of read_memory to enable extra caching. */
309 /* Actual contents of the value. Target byte-order. NULL or not
310 valid if lazy is nonzero. */
313 /* Unavailable ranges in CONTENTS. We mark unavailable ranges,
314 rather than available, since the common and default case is for a
315 value to be available. This is filled in at value read time. */
316 VEC(range_s) *unavailable;
318 /* The number of references to this value. When a value is created,
319 the value chain holds a reference, so REFERENCE_COUNT is 1. If
320 release_value is called, this value is removed from the chain but
321 the caller of release_value now has a reference to this value.
322 The caller must arrange for a call to value_free later. */
327 value_bytes_available (const struct value *value, int offset, int length)
329 gdb_assert (!value->lazy);
331 return !ranges_contain (value->unavailable, offset, length);
335 value_entirely_available (struct value *value)
337 /* We can only tell whether the whole value is available when we try
340 value_fetch_lazy (value);
342 if (VEC_empty (range_s, value->unavailable))
348 mark_value_bytes_unavailable (struct value *value, int offset, int length)
353 /* Insert the range sorted. If there's overlap or the new range
354 would be contiguous with an existing range, merge. */
356 newr.offset = offset;
357 newr.length = length;
359 /* Do a binary search for the position the given range would be
360 inserted if we only considered the starting OFFSET of ranges.
361 Call that position I. Since we also have LENGTH to care for
362 (this is a range afterall), we need to check if the _previous_
363 range overlaps the I range. E.g., calling R the new range:
365 #1 - overlaps with previous
369 |---| |---| |------| ... |--|
374 In the case #1 above, the binary search would return `I=1',
375 meaning, this OFFSET should be inserted at position 1, and the
376 current position 1 should be pushed further (and become 2). But,
377 note that `0' overlaps with R, so we want to merge them.
379 A similar consideration needs to be taken if the new range would
380 be contiguous with the previous range:
382 #2 - contiguous with previous
386 |--| |---| |------| ... |--|
391 If there's no overlap with the previous range, as in:
393 #3 - not overlapping and not contiguous
397 |--| |---| |------| ... |--|
404 #4 - R is the range with lowest offset
408 |--| |---| |------| ... |--|
413 ... we just push the new range to I.
415 All the 4 cases above need to consider that the new range may
416 also overlap several of the ranges that follow, or that R may be
417 contiguous with the following range, and merge. E.g.,
419 #5 - overlapping following ranges
422 |------------------------|
423 |--| |---| |------| ... |--|
432 |--| |---| |------| ... |--|
439 i = VEC_lower_bound (range_s, value->unavailable, &newr, range_lessthan);
442 struct range *bef = VEC_index (range_s, value->unavailable, i - 1);
444 if (ranges_overlap (bef->offset, bef->length, offset, length))
447 ULONGEST l = min (bef->offset, offset);
448 ULONGEST h = max (bef->offset + bef->length, offset + length);
454 else if (offset == bef->offset + bef->length)
457 bef->length += length;
463 VEC_safe_insert (range_s, value->unavailable, i, &newr);
469 VEC_safe_insert (range_s, value->unavailable, i, &newr);
472 /* Check whether the ranges following the one we've just added or
473 touched can be folded in (#5 above). */
474 if (i + 1 < VEC_length (range_s, value->unavailable))
481 /* Get the range we just touched. */
482 t = VEC_index (range_s, value->unavailable, i);
486 for (; VEC_iterate (range_s, value->unavailable, i, r); i++)
487 if (r->offset <= t->offset + t->length)
491 l = min (t->offset, r->offset);
492 h = max (t->offset + t->length, r->offset + r->length);
501 /* If we couldn't merge this one, we won't be able to
502 merge following ones either, since the ranges are
503 always sorted by OFFSET. */
508 VEC_block_remove (range_s, value->unavailable, next, removed);
512 /* Find the first range in RANGES that overlaps the range defined by
513 OFFSET and LENGTH, starting at element POS in the RANGES vector,
514 Returns the index into RANGES where such overlapping range was
515 found, or -1 if none was found. */
518 find_first_range_overlap (VEC(range_s) *ranges, int pos,
519 int offset, int length)
524 for (i = pos; VEC_iterate (range_s, ranges, i, r); i++)
525 if (ranges_overlap (r->offset, r->length, offset, length))
532 value_available_contents_eq (const struct value *val1, int offset1,
533 const struct value *val2, int offset2,
536 int org_len = length;
537 int org_offset1 = offset1;
538 int org_offset2 = offset2;
539 int idx1 = 0, idx2 = 0;
542 /* This routine is used by printing routines, where we should
543 already have read the value. Note that we only know whether a
544 value chunk is available if we've tried to read it. */
545 gdb_assert (!val1->lazy && !val2->lazy);
547 /* The offset from either ORG_OFFSET1 or ORG_OFFSET2 where the
548 available contents we haven't compared yet start. */
557 idx1 = find_first_range_overlap (val1->unavailable, idx1,
559 idx2 = find_first_range_overlap (val2->unavailable, idx2,
562 /* The usual case is for both values to be completely available. */
563 if (idx1 == -1 && idx2 == -1)
564 return (memcmp (val1->contents + org_offset1 + prev_avail,
565 val2->contents + org_offset2 + prev_avail,
566 org_len - prev_avail) == 0);
567 /* The contents only match equal if the available set matches as
569 else if (idx1 == -1 || idx2 == -1)
572 gdb_assert (idx1 != -1 && idx2 != -1);
574 r1 = VEC_index (range_s, val1->unavailable, idx1);
575 r2 = VEC_index (range_s, val2->unavailable, idx2);
577 /* Get the unavailable windows intersected by the incoming
578 ranges. The first and last ranges that overlap the argument
579 range may be wider than said incoming arguments ranges. */
580 l1 = max (offset1, r1->offset);
581 h1 = min (offset1 + length, r1->offset + r1->length);
583 l2 = max (offset2, r2->offset);
584 h2 = min (offset2 + length, r2->offset + r2->length);
586 /* Make them relative to the respective start offsets, so we can
587 compare them for equality. */
594 /* Different availability, no match. */
595 if (l1 != l2 || h1 != h2)
598 /* Compare the _available_ contents. */
599 if (memcmp (val1->contents + org_offset1 + prev_avail,
600 val2->contents + org_offset2 + prev_avail,
601 l2 - prev_avail) != 0)
613 /* Prototypes for local functions. */
615 static void show_values (char *, int);
617 static void show_convenience (char *, int);
620 /* The value-history records all the values printed
621 by print commands during this session. Each chunk
622 records 60 consecutive values. The first chunk on
623 the chain records the most recent values.
624 The total number of values is in value_history_count. */
626 #define VALUE_HISTORY_CHUNK 60
628 struct value_history_chunk
630 struct value_history_chunk *next;
631 struct value *values[VALUE_HISTORY_CHUNK];
634 /* Chain of chunks now in use. */
636 static struct value_history_chunk *value_history_chain;
638 static int value_history_count; /* Abs number of last entry stored. */
641 /* List of all value objects currently allocated
642 (except for those released by calls to release_value)
643 This is so they can be freed after each command. */
645 static struct value *all_values;
647 /* Allocate a lazy value for type TYPE. Its actual content is
648 "lazily" allocated too: the content field of the return value is
649 NULL; it will be allocated when it is fetched from the target. */
652 allocate_value_lazy (struct type *type)
656 /* Call check_typedef on our type to make sure that, if TYPE
657 is a TYPE_CODE_TYPEDEF, its length is set to the length
658 of the target type instead of zero. However, we do not
659 replace the typedef type by the target type, because we want
660 to keep the typedef in order to be able to set the VAL's type
661 description correctly. */
662 check_typedef (type);
664 val = (struct value *) xzalloc (sizeof (struct value));
665 val->contents = NULL;
666 val->next = all_values;
669 val->enclosing_type = type;
670 VALUE_LVAL (val) = not_lval;
671 val->location.address = 0;
672 VALUE_FRAME_ID (val) = null_frame_id;
676 VALUE_REGNUM (val) = -1;
678 val->optimized_out = 0;
679 val->embedded_offset = 0;
680 val->pointed_to_offset = 0;
682 val->initialized = 1; /* Default to initialized. */
684 /* Values start out on the all_values chain. */
685 val->reference_count = 1;
690 /* Allocate the contents of VAL if it has not been allocated yet. */
693 allocate_value_contents (struct value *val)
696 val->contents = (gdb_byte *) xzalloc (TYPE_LENGTH (val->enclosing_type));
699 /* Allocate a value and its contents for type TYPE. */
702 allocate_value (struct type *type)
704 struct value *val = allocate_value_lazy (type);
706 allocate_value_contents (val);
711 /* Allocate a value that has the correct length
712 for COUNT repetitions of type TYPE. */
715 allocate_repeat_value (struct type *type, int count)
717 int low_bound = current_language->string_lower_bound; /* ??? */
718 /* FIXME-type-allocation: need a way to free this type when we are
720 struct type *array_type
721 = lookup_array_range_type (type, low_bound, count + low_bound - 1);
723 return allocate_value (array_type);
727 allocate_computed_value (struct type *type,
728 struct lval_funcs *funcs,
731 struct value *v = allocate_value_lazy (type);
733 VALUE_LVAL (v) = lval_computed;
734 v->location.computed.funcs = funcs;
735 v->location.computed.closure = closure;
740 /* Accessor methods. */
743 value_next (struct value *value)
749 value_type (const struct value *value)
754 deprecated_set_value_type (struct value *value, struct type *type)
760 value_offset (const struct value *value)
762 return value->offset;
765 set_value_offset (struct value *value, int offset)
767 value->offset = offset;
771 value_bitpos (const struct value *value)
773 return value->bitpos;
776 set_value_bitpos (struct value *value, int bit)
782 value_bitsize (const struct value *value)
784 return value->bitsize;
787 set_value_bitsize (struct value *value, int bit)
789 value->bitsize = bit;
793 value_parent (struct value *value)
795 return value->parent;
799 value_contents_raw (struct value *value)
801 allocate_value_contents (value);
802 return value->contents + value->embedded_offset;
806 value_contents_all_raw (struct value *value)
808 allocate_value_contents (value);
809 return value->contents;
813 value_enclosing_type (struct value *value)
815 return value->enclosing_type;
819 require_not_optimized_out (const struct value *value)
821 if (value->optimized_out)
822 error (_("value has been optimized out"));
826 require_available (const struct value *value)
828 if (!VEC_empty (range_s, value->unavailable))
829 throw_error (NOT_AVAILABLE_ERROR, _("value is not available"));
833 value_contents_for_printing (struct value *value)
836 value_fetch_lazy (value);
837 return value->contents;
841 value_contents_for_printing_const (const struct value *value)
843 gdb_assert (!value->lazy);
844 return value->contents;
848 value_contents_all (struct value *value)
850 const gdb_byte *result = value_contents_for_printing (value);
851 require_not_optimized_out (value);
852 require_available (value);
856 /* Copy LENGTH bytes of SRC value's contents starting at SRC_OFFSET,
857 into DST value's contents, starting at DST_OFFSET. If unavailable
858 contents are being copied from SRC, the corresponding DST contents
859 are marked unavailable accordingly. Neither DST nor SRC may be
863 value_contents_copy_raw (struct value *dst, int dst_offset,
864 struct value *src, int src_offset, int length)
869 /* A lazy DST would make that this copy operation useless, since as
870 soon as DST's contents were un-lazied (by a later value_contents
871 call, say), the contents would be overwritten. A lazy SRC would
872 mean we'd be copying garbage. */
873 gdb_assert (!dst->lazy && !src->lazy);
876 memcpy (value_contents_all_raw (dst) + dst_offset,
877 value_contents_all_raw (src) + src_offset,
880 /* Copy the meta-data, adjusted. */
881 for (i = 0; VEC_iterate (range_s, src->unavailable, i, r); i++)
885 l = max (r->offset, src_offset);
886 h = min (r->offset + r->length, src_offset + length);
889 mark_value_bytes_unavailable (dst,
890 dst_offset + (l - src_offset),
895 /* Copy LENGTH bytes of SRC value's contents starting at SRC_OFFSET
896 byte, into DST value's contents, starting at DST_OFFSET. If
897 unavailable contents are being copied from SRC, the corresponding
898 DST contents are marked unavailable accordingly. DST must not be
899 lazy. If SRC is lazy, it will be fetched now. If SRC is not valid
900 (is optimized out), an error is thrown. */
903 value_contents_copy (struct value *dst, int dst_offset,
904 struct value *src, int src_offset, int length)
906 require_not_optimized_out (src);
909 value_fetch_lazy (src);
911 value_contents_copy_raw (dst, dst_offset, src, src_offset, length);
915 value_lazy (struct value *value)
921 set_value_lazy (struct value *value, int val)
927 value_stack (struct value *value)
933 set_value_stack (struct value *value, int val)
939 value_contents (struct value *value)
941 const gdb_byte *result = value_contents_writeable (value);
942 require_not_optimized_out (value);
943 require_available (value);
948 value_contents_writeable (struct value *value)
951 value_fetch_lazy (value);
952 return value_contents_raw (value);
955 /* Return non-zero if VAL1 and VAL2 have the same contents. Note that
956 this function is different from value_equal; in C the operator ==
957 can return 0 even if the two values being compared are equal. */
960 value_contents_equal (struct value *val1, struct value *val2)
966 type1 = check_typedef (value_type (val1));
967 type2 = check_typedef (value_type (val2));
968 len = TYPE_LENGTH (type1);
969 if (len != TYPE_LENGTH (type2))
972 return (memcmp (value_contents (val1), value_contents (val2), len) == 0);
976 value_optimized_out (struct value *value)
978 return value->optimized_out;
982 set_value_optimized_out (struct value *value, int val)
984 value->optimized_out = val;
988 value_entirely_optimized_out (const struct value *value)
990 if (!value->optimized_out)
992 if (value->lval != lval_computed
993 || !value->location.computed.funcs->check_any_valid)
995 return !value->location.computed.funcs->check_any_valid (value);
999 value_bits_valid (const struct value *value, int offset, int length)
1001 if (!value->optimized_out)
1003 if (value->lval != lval_computed
1004 || !value->location.computed.funcs->check_validity)
1006 return value->location.computed.funcs->check_validity (value, offset,
1011 value_bits_synthetic_pointer (const struct value *value,
1012 int offset, int length)
1014 if (value->lval != lval_computed
1015 || !value->location.computed.funcs->check_synthetic_pointer)
1017 return value->location.computed.funcs->check_synthetic_pointer (value,
1023 value_embedded_offset (struct value *value)
1025 return value->embedded_offset;
1029 set_value_embedded_offset (struct value *value, int val)
1031 value->embedded_offset = val;
1035 value_pointed_to_offset (struct value *value)
1037 return value->pointed_to_offset;
1041 set_value_pointed_to_offset (struct value *value, int val)
1043 value->pointed_to_offset = val;
1047 value_computed_funcs (struct value *v)
1049 gdb_assert (VALUE_LVAL (v) == lval_computed);
1051 return v->location.computed.funcs;
1055 value_computed_closure (const struct value *v)
1057 gdb_assert (v->lval == lval_computed);
1059 return v->location.computed.closure;
1063 deprecated_value_lval_hack (struct value *value)
1065 return &value->lval;
1069 value_address (const struct value *value)
1071 if (value->lval == lval_internalvar
1072 || value->lval == lval_internalvar_component)
1074 return value->location.address + value->offset;
1078 value_raw_address (struct value *value)
1080 if (value->lval == lval_internalvar
1081 || value->lval == lval_internalvar_component)
1083 return value->location.address;
1087 set_value_address (struct value *value, CORE_ADDR addr)
1089 gdb_assert (value->lval != lval_internalvar
1090 && value->lval != lval_internalvar_component);
1091 value->location.address = addr;
1094 struct internalvar **
1095 deprecated_value_internalvar_hack (struct value *value)
1097 return &value->location.internalvar;
1101 deprecated_value_frame_id_hack (struct value *value)
1103 return &value->frame_id;
1107 deprecated_value_regnum_hack (struct value *value)
1109 return &value->regnum;
1113 deprecated_value_modifiable (struct value *value)
1115 return value->modifiable;
1118 deprecated_set_value_modifiable (struct value *value, int modifiable)
1120 value->modifiable = modifiable;
1123 /* Return a mark in the value chain. All values allocated after the
1124 mark is obtained (except for those released) are subject to being freed
1125 if a subsequent value_free_to_mark is passed the mark. */
1132 /* Take a reference to VAL. VAL will not be deallocated until all
1133 references are released. */
1136 value_incref (struct value *val)
1138 val->reference_count++;
1141 /* Release a reference to VAL, which was acquired with value_incref.
1142 This function is also called to deallocate values from the value
1146 value_free (struct value *val)
1150 gdb_assert (val->reference_count > 0);
1151 val->reference_count--;
1152 if (val->reference_count > 0)
1155 /* If there's an associated parent value, drop our reference to
1157 if (val->parent != NULL)
1158 value_free (val->parent);
1160 if (VALUE_LVAL (val) == lval_computed)
1162 struct lval_funcs *funcs = val->location.computed.funcs;
1164 if (funcs->free_closure)
1165 funcs->free_closure (val);
1168 xfree (val->contents);
1169 VEC_free (range_s, val->unavailable);
1174 /* Free all values allocated since MARK was obtained by value_mark
1175 (except for those released). */
1177 value_free_to_mark (struct value *mark)
1182 for (val = all_values; val && val != mark; val = next)
1190 /* Free all the values that have been allocated (except for those released).
1191 Call after each command, successful or not.
1192 In practice this is called before each command, which is sufficient. */
1195 free_all_values (void)
1200 for (val = all_values; val; val = next)
1209 /* Frees all the elements in a chain of values. */
1212 free_value_chain (struct value *v)
1218 next = value_next (v);
1223 /* Remove VAL from the chain all_values
1224 so it will not be freed automatically. */
1227 release_value (struct value *val)
1231 if (all_values == val)
1233 all_values = val->next;
1238 for (v = all_values; v; v = v->next)
1242 v->next = val->next;
1249 /* Release all values up to mark */
1251 value_release_to_mark (struct value *mark)
1256 for (val = next = all_values; next; next = next->next)
1257 if (next->next == mark)
1259 all_values = next->next;
1267 /* Return a copy of the value ARG.
1268 It contains the same contents, for same memory address,
1269 but it's a different block of storage. */
1272 value_copy (struct value *arg)
1274 struct type *encl_type = value_enclosing_type (arg);
1277 if (value_lazy (arg))
1278 val = allocate_value_lazy (encl_type);
1280 val = allocate_value (encl_type);
1281 val->type = arg->type;
1282 VALUE_LVAL (val) = VALUE_LVAL (arg);
1283 val->location = arg->location;
1284 val->offset = arg->offset;
1285 val->bitpos = arg->bitpos;
1286 val->bitsize = arg->bitsize;
1287 VALUE_FRAME_ID (val) = VALUE_FRAME_ID (arg);
1288 VALUE_REGNUM (val) = VALUE_REGNUM (arg);
1289 val->lazy = arg->lazy;
1290 val->optimized_out = arg->optimized_out;
1291 val->embedded_offset = value_embedded_offset (arg);
1292 val->pointed_to_offset = arg->pointed_to_offset;
1293 val->modifiable = arg->modifiable;
1294 if (!value_lazy (val))
1296 memcpy (value_contents_all_raw (val), value_contents_all_raw (arg),
1297 TYPE_LENGTH (value_enclosing_type (arg)));
1300 val->unavailable = VEC_copy (range_s, arg->unavailable);
1301 val->parent = arg->parent;
1303 value_incref (val->parent);
1304 if (VALUE_LVAL (val) == lval_computed)
1306 struct lval_funcs *funcs = val->location.computed.funcs;
1308 if (funcs->copy_closure)
1309 val->location.computed.closure = funcs->copy_closure (val);
1314 /* Return a version of ARG that is non-lvalue. */
1317 value_non_lval (struct value *arg)
1319 if (VALUE_LVAL (arg) != not_lval)
1321 struct type *enc_type = value_enclosing_type (arg);
1322 struct value *val = allocate_value (enc_type);
1324 memcpy (value_contents_all_raw (val), value_contents_all (arg),
1325 TYPE_LENGTH (enc_type));
1326 val->type = arg->type;
1327 set_value_embedded_offset (val, value_embedded_offset (arg));
1328 set_value_pointed_to_offset (val, value_pointed_to_offset (arg));
1335 set_value_component_location (struct value *component,
1336 const struct value *whole)
1338 if (whole->lval == lval_internalvar)
1339 VALUE_LVAL (component) = lval_internalvar_component;
1341 VALUE_LVAL (component) = whole->lval;
1343 component->location = whole->location;
1344 if (whole->lval == lval_computed)
1346 struct lval_funcs *funcs = whole->location.computed.funcs;
1348 if (funcs->copy_closure)
1349 component->location.computed.closure = funcs->copy_closure (whole);
1354 /* Access to the value history. */
1356 /* Record a new value in the value history.
1357 Returns the absolute history index of the entry.
1358 Result of -1 indicates the value was not saved; otherwise it is the
1359 value history index of this new item. */
1362 record_latest_value (struct value *val)
1366 /* We don't want this value to have anything to do with the inferior anymore.
1367 In particular, "set $1 = 50" should not affect the variable from which
1368 the value was taken, and fast watchpoints should be able to assume that
1369 a value on the value history never changes. */
1370 if (value_lazy (val))
1371 value_fetch_lazy (val);
1372 /* We preserve VALUE_LVAL so that the user can find out where it was fetched
1373 from. This is a bit dubious, because then *&$1 does not just return $1
1374 but the current contents of that location. c'est la vie... */
1375 val->modifiable = 0;
1376 release_value (val);
1378 /* Here we treat value_history_count as origin-zero
1379 and applying to the value being stored now. */
1381 i = value_history_count % VALUE_HISTORY_CHUNK;
1384 struct value_history_chunk *new
1385 = (struct value_history_chunk *)
1387 xmalloc (sizeof (struct value_history_chunk));
1388 memset (new->values, 0, sizeof new->values);
1389 new->next = value_history_chain;
1390 value_history_chain = new;
1393 value_history_chain->values[i] = val;
1395 /* Now we regard value_history_count as origin-one
1396 and applying to the value just stored. */
1398 return ++value_history_count;
1401 /* Return a copy of the value in the history with sequence number NUM. */
1404 access_value_history (int num)
1406 struct value_history_chunk *chunk;
1411 absnum += value_history_count;
1416 error (_("The history is empty."));
1418 error (_("There is only one value in the history."));
1420 error (_("History does not go back to $$%d."), -num);
1422 if (absnum > value_history_count)
1423 error (_("History has not yet reached $%d."), absnum);
1427 /* Now absnum is always absolute and origin zero. */
1429 chunk = value_history_chain;
1430 for (i = (value_history_count - 1) / VALUE_HISTORY_CHUNK
1431 - absnum / VALUE_HISTORY_CHUNK;
1433 chunk = chunk->next;
1435 return value_copy (chunk->values[absnum % VALUE_HISTORY_CHUNK]);
1439 show_values (char *num_exp, int from_tty)
1447 /* "show values +" should print from the stored position.
1448 "show values <exp>" should print around value number <exp>. */
1449 if (num_exp[0] != '+' || num_exp[1] != '\0')
1450 num = parse_and_eval_long (num_exp) - 5;
1454 /* "show values" means print the last 10 values. */
1455 num = value_history_count - 9;
1461 for (i = num; i < num + 10 && i <= value_history_count; i++)
1463 struct value_print_options opts;
1465 val = access_value_history (i);
1466 printf_filtered (("$%d = "), i);
1467 get_user_print_options (&opts);
1468 value_print (val, gdb_stdout, &opts);
1469 printf_filtered (("\n"));
1472 /* The next "show values +" should start after what we just printed. */
1475 /* Hitting just return after this command should do the same thing as
1476 "show values +". If num_exp is null, this is unnecessary, since
1477 "show values +" is not useful after "show values". */
1478 if (from_tty && num_exp)
1485 /* Internal variables. These are variables within the debugger
1486 that hold values assigned by debugger commands.
1487 The user refers to them with a '$' prefix
1488 that does not appear in the variable names stored internally. */
1492 struct internalvar *next;
1495 /* We support various different kinds of content of an internal variable.
1496 enum internalvar_kind specifies the kind, and union internalvar_data
1497 provides the data associated with this particular kind. */
1499 enum internalvar_kind
1501 /* The internal variable is empty. */
1504 /* The value of the internal variable is provided directly as
1505 a GDB value object. */
1508 /* A fresh value is computed via a call-back routine on every
1509 access to the internal variable. */
1510 INTERNALVAR_MAKE_VALUE,
1512 /* The internal variable holds a GDB internal convenience function. */
1513 INTERNALVAR_FUNCTION,
1515 /* The variable holds an integer value. */
1516 INTERNALVAR_INTEGER,
1518 /* The variable holds a GDB-provided string. */
1523 union internalvar_data
1525 /* A value object used with INTERNALVAR_VALUE. */
1526 struct value *value;
1528 /* The call-back routine used with INTERNALVAR_MAKE_VALUE. */
1529 internalvar_make_value make_value;
1531 /* The internal function used with INTERNALVAR_FUNCTION. */
1534 struct internal_function *function;
1535 /* True if this is the canonical name for the function. */
1539 /* An integer value used with INTERNALVAR_INTEGER. */
1542 /* If type is non-NULL, it will be used as the type to generate
1543 a value for this internal variable. If type is NULL, a default
1544 integer type for the architecture is used. */
1549 /* A string value used with INTERNALVAR_STRING. */
1554 static struct internalvar *internalvars;
1556 /* If the variable does not already exist create it and give it the
1557 value given. If no value is given then the default is zero. */
1559 init_if_undefined_command (char* args, int from_tty)
1561 struct internalvar* intvar;
1563 /* Parse the expression - this is taken from set_command(). */
1564 struct expression *expr = parse_expression (args);
1565 register struct cleanup *old_chain =
1566 make_cleanup (free_current_contents, &expr);
1568 /* Validate the expression.
1569 Was the expression an assignment?
1570 Or even an expression at all? */
1571 if (expr->nelts == 0 || expr->elts[0].opcode != BINOP_ASSIGN)
1572 error (_("Init-if-undefined requires an assignment expression."));
1574 /* Extract the variable from the parsed expression.
1575 In the case of an assign the lvalue will be in elts[1] and elts[2]. */
1576 if (expr->elts[1].opcode != OP_INTERNALVAR)
1577 error (_("The first parameter to init-if-undefined "
1578 "should be a GDB variable."));
1579 intvar = expr->elts[2].internalvar;
1581 /* Only evaluate the expression if the lvalue is void.
1582 This may still fail if the expresssion is invalid. */
1583 if (intvar->kind == INTERNALVAR_VOID)
1584 evaluate_expression (expr);
1586 do_cleanups (old_chain);
1590 /* Look up an internal variable with name NAME. NAME should not
1591 normally include a dollar sign.
1593 If the specified internal variable does not exist,
1594 the return value is NULL. */
1596 struct internalvar *
1597 lookup_only_internalvar (const char *name)
1599 struct internalvar *var;
1601 for (var = internalvars; var; var = var->next)
1602 if (strcmp (var->name, name) == 0)
1609 /* Create an internal variable with name NAME and with a void value.
1610 NAME should not normally include a dollar sign. */
1612 struct internalvar *
1613 create_internalvar (const char *name)
1615 struct internalvar *var;
1617 var = (struct internalvar *) xmalloc (sizeof (struct internalvar));
1618 var->name = concat (name, (char *)NULL);
1619 var->kind = INTERNALVAR_VOID;
1620 var->next = internalvars;
1625 /* Create an internal variable with name NAME and register FUN as the
1626 function that value_of_internalvar uses to create a value whenever
1627 this variable is referenced. NAME should not normally include a
1630 struct internalvar *
1631 create_internalvar_type_lazy (char *name, internalvar_make_value fun)
1633 struct internalvar *var = create_internalvar (name);
1635 var->kind = INTERNALVAR_MAKE_VALUE;
1636 var->u.make_value = fun;
1640 /* Look up an internal variable with name NAME. NAME should not
1641 normally include a dollar sign.
1643 If the specified internal variable does not exist,
1644 one is created, with a void value. */
1646 struct internalvar *
1647 lookup_internalvar (const char *name)
1649 struct internalvar *var;
1651 var = lookup_only_internalvar (name);
1655 return create_internalvar (name);
1658 /* Return current value of internal variable VAR. For variables that
1659 are not inherently typed, use a value type appropriate for GDBARCH. */
1662 value_of_internalvar (struct gdbarch *gdbarch, struct internalvar *var)
1665 struct trace_state_variable *tsv;
1667 /* If there is a trace state variable of the same name, assume that
1668 is what we really want to see. */
1669 tsv = find_trace_state_variable (var->name);
1672 tsv->value_known = target_get_trace_state_variable_value (tsv->number,
1674 if (tsv->value_known)
1675 val = value_from_longest (builtin_type (gdbarch)->builtin_int64,
1678 val = allocate_value (builtin_type (gdbarch)->builtin_void);
1684 case INTERNALVAR_VOID:
1685 val = allocate_value (builtin_type (gdbarch)->builtin_void);
1688 case INTERNALVAR_FUNCTION:
1689 val = allocate_value (builtin_type (gdbarch)->internal_fn);
1692 case INTERNALVAR_INTEGER:
1693 if (!var->u.integer.type)
1694 val = value_from_longest (builtin_type (gdbarch)->builtin_int,
1695 var->u.integer.val);
1697 val = value_from_longest (var->u.integer.type, var->u.integer.val);
1700 case INTERNALVAR_STRING:
1701 val = value_cstring (var->u.string, strlen (var->u.string),
1702 builtin_type (gdbarch)->builtin_char);
1705 case INTERNALVAR_VALUE:
1706 val = value_copy (var->u.value);
1707 if (value_lazy (val))
1708 value_fetch_lazy (val);
1711 case INTERNALVAR_MAKE_VALUE:
1712 val = (*var->u.make_value) (gdbarch, var);
1716 internal_error (__FILE__, __LINE__, _("bad kind"));
1719 /* Change the VALUE_LVAL to lval_internalvar so that future operations
1720 on this value go back to affect the original internal variable.
1722 Do not do this for INTERNALVAR_MAKE_VALUE variables, as those have
1723 no underlying modifyable state in the internal variable.
1725 Likewise, if the variable's value is a computed lvalue, we want
1726 references to it to produce another computed lvalue, where
1727 references and assignments actually operate through the
1728 computed value's functions.
1730 This means that internal variables with computed values
1731 behave a little differently from other internal variables:
1732 assignments to them don't just replace the previous value
1733 altogether. At the moment, this seems like the behavior we
1736 if (var->kind != INTERNALVAR_MAKE_VALUE
1737 && val->lval != lval_computed)
1739 VALUE_LVAL (val) = lval_internalvar;
1740 VALUE_INTERNALVAR (val) = var;
1747 get_internalvar_integer (struct internalvar *var, LONGEST *result)
1749 if (var->kind == INTERNALVAR_INTEGER)
1751 *result = var->u.integer.val;
1755 if (var->kind == INTERNALVAR_VALUE)
1757 struct type *type = check_typedef (value_type (var->u.value));
1759 if (TYPE_CODE (type) == TYPE_CODE_INT)
1761 *result = value_as_long (var->u.value);
1770 get_internalvar_function (struct internalvar *var,
1771 struct internal_function **result)
1775 case INTERNALVAR_FUNCTION:
1776 *result = var->u.fn.function;
1785 set_internalvar_component (struct internalvar *var, int offset, int bitpos,
1786 int bitsize, struct value *newval)
1792 case INTERNALVAR_VALUE:
1793 addr = value_contents_writeable (var->u.value);
1796 modify_field (value_type (var->u.value), addr + offset,
1797 value_as_long (newval), bitpos, bitsize);
1799 memcpy (addr + offset, value_contents (newval),
1800 TYPE_LENGTH (value_type (newval)));
1804 /* We can never get a component of any other kind. */
1805 internal_error (__FILE__, __LINE__, _("set_internalvar_component"));
1810 set_internalvar (struct internalvar *var, struct value *val)
1812 enum internalvar_kind new_kind;
1813 union internalvar_data new_data = { 0 };
1815 if (var->kind == INTERNALVAR_FUNCTION && var->u.fn.canonical)
1816 error (_("Cannot overwrite convenience function %s"), var->name);
1818 /* Prepare new contents. */
1819 switch (TYPE_CODE (check_typedef (value_type (val))))
1821 case TYPE_CODE_VOID:
1822 new_kind = INTERNALVAR_VOID;
1825 case TYPE_CODE_INTERNAL_FUNCTION:
1826 gdb_assert (VALUE_LVAL (val) == lval_internalvar);
1827 new_kind = INTERNALVAR_FUNCTION;
1828 get_internalvar_function (VALUE_INTERNALVAR (val),
1829 &new_data.fn.function);
1830 /* Copies created here are never canonical. */
1834 new_kind = INTERNALVAR_VALUE;
1835 new_data.value = value_copy (val);
1836 new_data.value->modifiable = 1;
1838 /* Force the value to be fetched from the target now, to avoid problems
1839 later when this internalvar is referenced and the target is gone or
1841 if (value_lazy (new_data.value))
1842 value_fetch_lazy (new_data.value);
1844 /* Release the value from the value chain to prevent it from being
1845 deleted by free_all_values. From here on this function should not
1846 call error () until new_data is installed into the var->u to avoid
1848 release_value (new_data.value);
1852 /* Clean up old contents. */
1853 clear_internalvar (var);
1856 var->kind = new_kind;
1858 /* End code which must not call error(). */
1862 set_internalvar_integer (struct internalvar *var, LONGEST l)
1864 /* Clean up old contents. */
1865 clear_internalvar (var);
1867 var->kind = INTERNALVAR_INTEGER;
1868 var->u.integer.type = NULL;
1869 var->u.integer.val = l;
1873 set_internalvar_string (struct internalvar *var, const char *string)
1875 /* Clean up old contents. */
1876 clear_internalvar (var);
1878 var->kind = INTERNALVAR_STRING;
1879 var->u.string = xstrdup (string);
1883 set_internalvar_function (struct internalvar *var, struct internal_function *f)
1885 /* Clean up old contents. */
1886 clear_internalvar (var);
1888 var->kind = INTERNALVAR_FUNCTION;
1889 var->u.fn.function = f;
1890 var->u.fn.canonical = 1;
1891 /* Variables installed here are always the canonical version. */
1895 clear_internalvar (struct internalvar *var)
1897 /* Clean up old contents. */
1900 case INTERNALVAR_VALUE:
1901 value_free (var->u.value);
1904 case INTERNALVAR_STRING:
1905 xfree (var->u.string);
1912 /* Reset to void kind. */
1913 var->kind = INTERNALVAR_VOID;
1917 internalvar_name (struct internalvar *var)
1922 static struct internal_function *
1923 create_internal_function (const char *name,
1924 internal_function_fn handler, void *cookie)
1926 struct internal_function *ifn = XNEW (struct internal_function);
1928 ifn->name = xstrdup (name);
1929 ifn->handler = handler;
1930 ifn->cookie = cookie;
1935 value_internal_function_name (struct value *val)
1937 struct internal_function *ifn;
1940 gdb_assert (VALUE_LVAL (val) == lval_internalvar);
1941 result = get_internalvar_function (VALUE_INTERNALVAR (val), &ifn);
1942 gdb_assert (result);
1948 call_internal_function (struct gdbarch *gdbarch,
1949 const struct language_defn *language,
1950 struct value *func, int argc, struct value **argv)
1952 struct internal_function *ifn;
1955 gdb_assert (VALUE_LVAL (func) == lval_internalvar);
1956 result = get_internalvar_function (VALUE_INTERNALVAR (func), &ifn);
1957 gdb_assert (result);
1959 return (*ifn->handler) (gdbarch, language, ifn->cookie, argc, argv);
1962 /* The 'function' command. This does nothing -- it is just a
1963 placeholder to let "help function NAME" work. This is also used as
1964 the implementation of the sub-command that is created when
1965 registering an internal function. */
1967 function_command (char *command, int from_tty)
1972 /* Clean up if an internal function's command is destroyed. */
1974 function_destroyer (struct cmd_list_element *self, void *ignore)
1980 /* Add a new internal function. NAME is the name of the function; DOC
1981 is a documentation string describing the function. HANDLER is
1982 called when the function is invoked. COOKIE is an arbitrary
1983 pointer which is passed to HANDLER and is intended for "user
1986 add_internal_function (const char *name, const char *doc,
1987 internal_function_fn handler, void *cookie)
1989 struct cmd_list_element *cmd;
1990 struct internal_function *ifn;
1991 struct internalvar *var = lookup_internalvar (name);
1993 ifn = create_internal_function (name, handler, cookie);
1994 set_internalvar_function (var, ifn);
1996 cmd = add_cmd (xstrdup (name), no_class, function_command, (char *) doc,
1998 cmd->destroyer = function_destroyer;
2001 /* Update VALUE before discarding OBJFILE. COPIED_TYPES is used to
2002 prevent cycles / duplicates. */
2005 preserve_one_value (struct value *value, struct objfile *objfile,
2006 htab_t copied_types)
2008 if (TYPE_OBJFILE (value->type) == objfile)
2009 value->type = copy_type_recursive (objfile, value->type, copied_types);
2011 if (TYPE_OBJFILE (value->enclosing_type) == objfile)
2012 value->enclosing_type = copy_type_recursive (objfile,
2013 value->enclosing_type,
2017 /* Likewise for internal variable VAR. */
2020 preserve_one_internalvar (struct internalvar *var, struct objfile *objfile,
2021 htab_t copied_types)
2025 case INTERNALVAR_INTEGER:
2026 if (var->u.integer.type && TYPE_OBJFILE (var->u.integer.type) == objfile)
2028 = copy_type_recursive (objfile, var->u.integer.type, copied_types);
2031 case INTERNALVAR_VALUE:
2032 preserve_one_value (var->u.value, objfile, copied_types);
2037 /* Update the internal variables and value history when OBJFILE is
2038 discarded; we must copy the types out of the objfile. New global types
2039 will be created for every convenience variable which currently points to
2040 this objfile's types, and the convenience variables will be adjusted to
2041 use the new global types. */
2044 preserve_values (struct objfile *objfile)
2046 htab_t copied_types;
2047 struct value_history_chunk *cur;
2048 struct internalvar *var;
2051 /* Create the hash table. We allocate on the objfile's obstack, since
2052 it is soon to be deleted. */
2053 copied_types = create_copied_types_hash (objfile);
2055 for (cur = value_history_chain; cur; cur = cur->next)
2056 for (i = 0; i < VALUE_HISTORY_CHUNK; i++)
2058 preserve_one_value (cur->values[i], objfile, copied_types);
2060 for (var = internalvars; var; var = var->next)
2061 preserve_one_internalvar (var, objfile, copied_types);
2063 preserve_python_values (objfile, copied_types);
2065 htab_delete (copied_types);
2069 show_convenience (char *ignore, int from_tty)
2071 struct gdbarch *gdbarch = get_current_arch ();
2072 struct internalvar *var;
2074 struct value_print_options opts;
2076 get_user_print_options (&opts);
2077 for (var = internalvars; var; var = var->next)
2083 printf_filtered (("$%s = "), var->name);
2084 value_print (value_of_internalvar (gdbarch, var), gdb_stdout,
2086 printf_filtered (("\n"));
2089 printf_unfiltered (_("No debugger convenience variables now defined.\n"
2090 "Convenience variables have "
2091 "names starting with \"$\";\n"
2092 "use \"set\" as in \"set "
2093 "$foo = 5\" to define them.\n"));
2096 /* Extract a value as a C number (either long or double).
2097 Knows how to convert fixed values to double, or
2098 floating values to long.
2099 Does not deallocate the value. */
2102 value_as_long (struct value *val)
2104 /* This coerces arrays and functions, which is necessary (e.g.
2105 in disassemble_command). It also dereferences references, which
2106 I suspect is the most logical thing to do. */
2107 val = coerce_array (val);
2108 return unpack_long (value_type (val), value_contents (val));
2112 value_as_double (struct value *val)
2117 foo = unpack_double (value_type (val), value_contents (val), &inv);
2119 error (_("Invalid floating value found in program."));
2123 /* Extract a value as a C pointer. Does not deallocate the value.
2124 Note that val's type may not actually be a pointer; value_as_long
2125 handles all the cases. */
2127 value_as_address (struct value *val)
2129 struct gdbarch *gdbarch = get_type_arch (value_type (val));
2131 /* Assume a CORE_ADDR can fit in a LONGEST (for now). Not sure
2132 whether we want this to be true eventually. */
2134 /* gdbarch_addr_bits_remove is wrong if we are being called for a
2135 non-address (e.g. argument to "signal", "info break", etc.), or
2136 for pointers to char, in which the low bits *are* significant. */
2137 return gdbarch_addr_bits_remove (gdbarch, value_as_long (val));
2140 /* There are several targets (IA-64, PowerPC, and others) which
2141 don't represent pointers to functions as simply the address of
2142 the function's entry point. For example, on the IA-64, a
2143 function pointer points to a two-word descriptor, generated by
2144 the linker, which contains the function's entry point, and the
2145 value the IA-64 "global pointer" register should have --- to
2146 support position-independent code. The linker generates
2147 descriptors only for those functions whose addresses are taken.
2149 On such targets, it's difficult for GDB to convert an arbitrary
2150 function address into a function pointer; it has to either find
2151 an existing descriptor for that function, or call malloc and
2152 build its own. On some targets, it is impossible for GDB to
2153 build a descriptor at all: the descriptor must contain a jump
2154 instruction; data memory cannot be executed; and code memory
2157 Upon entry to this function, if VAL is a value of type `function'
2158 (that is, TYPE_CODE (VALUE_TYPE (val)) == TYPE_CODE_FUNC), then
2159 value_address (val) is the address of the function. This is what
2160 you'll get if you evaluate an expression like `main'. The call
2161 to COERCE_ARRAY below actually does all the usual unary
2162 conversions, which includes converting values of type `function'
2163 to `pointer to function'. This is the challenging conversion
2164 discussed above. Then, `unpack_long' will convert that pointer
2165 back into an address.
2167 So, suppose the user types `disassemble foo' on an architecture
2168 with a strange function pointer representation, on which GDB
2169 cannot build its own descriptors, and suppose further that `foo'
2170 has no linker-built descriptor. The address->pointer conversion
2171 will signal an error and prevent the command from running, even
2172 though the next step would have been to convert the pointer
2173 directly back into the same address.
2175 The following shortcut avoids this whole mess. If VAL is a
2176 function, just return its address directly. */
2177 if (TYPE_CODE (value_type (val)) == TYPE_CODE_FUNC
2178 || TYPE_CODE (value_type (val)) == TYPE_CODE_METHOD)
2179 return value_address (val);
2181 val = coerce_array (val);
2183 /* Some architectures (e.g. Harvard), map instruction and data
2184 addresses onto a single large unified address space. For
2185 instance: An architecture may consider a large integer in the
2186 range 0x10000000 .. 0x1000ffff to already represent a data
2187 addresses (hence not need a pointer to address conversion) while
2188 a small integer would still need to be converted integer to
2189 pointer to address. Just assume such architectures handle all
2190 integer conversions in a single function. */
2194 I think INTEGER_TO_ADDRESS is a good idea as proposed --- but we
2195 must admonish GDB hackers to make sure its behavior matches the
2196 compiler's, whenever possible.
2198 In general, I think GDB should evaluate expressions the same way
2199 the compiler does. When the user copies an expression out of
2200 their source code and hands it to a `print' command, they should
2201 get the same value the compiler would have computed. Any
2202 deviation from this rule can cause major confusion and annoyance,
2203 and needs to be justified carefully. In other words, GDB doesn't
2204 really have the freedom to do these conversions in clever and
2207 AndrewC pointed out that users aren't complaining about how GDB
2208 casts integers to pointers; they are complaining that they can't
2209 take an address from a disassembly listing and give it to `x/i'.
2210 This is certainly important.
2212 Adding an architecture method like integer_to_address() certainly
2213 makes it possible for GDB to "get it right" in all circumstances
2214 --- the target has complete control over how things get done, so
2215 people can Do The Right Thing for their target without breaking
2216 anyone else. The standard doesn't specify how integers get
2217 converted to pointers; usually, the ABI doesn't either, but
2218 ABI-specific code is a more reasonable place to handle it. */
2220 if (TYPE_CODE (value_type (val)) != TYPE_CODE_PTR
2221 && TYPE_CODE (value_type (val)) != TYPE_CODE_REF
2222 && gdbarch_integer_to_address_p (gdbarch))
2223 return gdbarch_integer_to_address (gdbarch, value_type (val),
2224 value_contents (val));
2226 return unpack_long (value_type (val), value_contents (val));
2230 /* Unpack raw data (copied from debugee, target byte order) at VALADDR
2231 as a long, or as a double, assuming the raw data is described
2232 by type TYPE. Knows how to convert different sizes of values
2233 and can convert between fixed and floating point. We don't assume
2234 any alignment for the raw data. Return value is in host byte order.
2236 If you want functions and arrays to be coerced to pointers, and
2237 references to be dereferenced, call value_as_long() instead.
2239 C++: It is assumed that the front-end has taken care of
2240 all matters concerning pointers to members. A pointer
2241 to member which reaches here is considered to be equivalent
2242 to an INT (or some size). After all, it is only an offset. */
2245 unpack_long (struct type *type, const gdb_byte *valaddr)
2247 enum bfd_endian byte_order = gdbarch_byte_order (get_type_arch (type));
2248 enum type_code code = TYPE_CODE (type);
2249 int len = TYPE_LENGTH (type);
2250 int nosign = TYPE_UNSIGNED (type);
2254 case TYPE_CODE_TYPEDEF:
2255 return unpack_long (check_typedef (type), valaddr);
2256 case TYPE_CODE_ENUM:
2257 case TYPE_CODE_FLAGS:
2258 case TYPE_CODE_BOOL:
2260 case TYPE_CODE_CHAR:
2261 case TYPE_CODE_RANGE:
2262 case TYPE_CODE_MEMBERPTR:
2264 return extract_unsigned_integer (valaddr, len, byte_order);
2266 return extract_signed_integer (valaddr, len, byte_order);
2269 return extract_typed_floating (valaddr, type);
2271 case TYPE_CODE_DECFLOAT:
2272 /* libdecnumber has a function to convert from decimal to integer, but
2273 it doesn't work when the decimal number has a fractional part. */
2274 return decimal_to_doublest (valaddr, len, byte_order);
2278 /* Assume a CORE_ADDR can fit in a LONGEST (for now). Not sure
2279 whether we want this to be true eventually. */
2280 return extract_typed_address (valaddr, type);
2283 error (_("Value can't be converted to integer."));
2285 return 0; /* Placate lint. */
2288 /* Return a double value from the specified type and address.
2289 INVP points to an int which is set to 0 for valid value,
2290 1 for invalid value (bad float format). In either case,
2291 the returned double is OK to use. Argument is in target
2292 format, result is in host format. */
2295 unpack_double (struct type *type, const gdb_byte *valaddr, int *invp)
2297 enum bfd_endian byte_order = gdbarch_byte_order (get_type_arch (type));
2298 enum type_code code;
2302 *invp = 0; /* Assume valid. */
2303 CHECK_TYPEDEF (type);
2304 code = TYPE_CODE (type);
2305 len = TYPE_LENGTH (type);
2306 nosign = TYPE_UNSIGNED (type);
2307 if (code == TYPE_CODE_FLT)
2309 /* NOTE: cagney/2002-02-19: There was a test here to see if the
2310 floating-point value was valid (using the macro
2311 INVALID_FLOAT). That test/macro have been removed.
2313 It turns out that only the VAX defined this macro and then
2314 only in a non-portable way. Fixing the portability problem
2315 wouldn't help since the VAX floating-point code is also badly
2316 bit-rotten. The target needs to add definitions for the
2317 methods gdbarch_float_format and gdbarch_double_format - these
2318 exactly describe the target floating-point format. The
2319 problem here is that the corresponding floatformat_vax_f and
2320 floatformat_vax_d values these methods should be set to are
2321 also not defined either. Oops!
2323 Hopefully someone will add both the missing floatformat
2324 definitions and the new cases for floatformat_is_valid (). */
2326 if (!floatformat_is_valid (floatformat_from_type (type), valaddr))
2332 return extract_typed_floating (valaddr, type);
2334 else if (code == TYPE_CODE_DECFLOAT)
2335 return decimal_to_doublest (valaddr, len, byte_order);
2338 /* Unsigned -- be sure we compensate for signed LONGEST. */
2339 return (ULONGEST) unpack_long (type, valaddr);
2343 /* Signed -- we are OK with unpack_long. */
2344 return unpack_long (type, valaddr);
2348 /* Unpack raw data (copied from debugee, target byte order) at VALADDR
2349 as a CORE_ADDR, assuming the raw data is described by type TYPE.
2350 We don't assume any alignment for the raw data. Return value is in
2353 If you want functions and arrays to be coerced to pointers, and
2354 references to be dereferenced, call value_as_address() instead.
2356 C++: It is assumed that the front-end has taken care of
2357 all matters concerning pointers to members. A pointer
2358 to member which reaches here is considered to be equivalent
2359 to an INT (or some size). After all, it is only an offset. */
2362 unpack_pointer (struct type *type, const gdb_byte *valaddr)
2364 /* Assume a CORE_ADDR can fit in a LONGEST (for now). Not sure
2365 whether we want this to be true eventually. */
2366 return unpack_long (type, valaddr);
2370 /* Get the value of the FIELDNO'th field (which must be static) of
2371 TYPE. Return NULL if the field doesn't exist or has been
2375 value_static_field (struct type *type, int fieldno)
2377 struct value *retval;
2379 switch (TYPE_FIELD_LOC_KIND (type, fieldno))
2381 case FIELD_LOC_KIND_PHYSADDR:
2382 retval = value_at_lazy (TYPE_FIELD_TYPE (type, fieldno),
2383 TYPE_FIELD_STATIC_PHYSADDR (type, fieldno));
2385 case FIELD_LOC_KIND_PHYSNAME:
2387 char *phys_name = TYPE_FIELD_STATIC_PHYSNAME (type, fieldno);
2388 /* TYPE_FIELD_NAME (type, fieldno); */
2389 struct symbol *sym = lookup_symbol (phys_name, 0, VAR_DOMAIN, 0);
2393 /* With some compilers, e.g. HP aCC, static data members are
2394 reported as non-debuggable symbols. */
2395 struct minimal_symbol *msym = lookup_minimal_symbol (phys_name,
2402 retval = value_at_lazy (TYPE_FIELD_TYPE (type, fieldno),
2403 SYMBOL_VALUE_ADDRESS (msym));
2407 retval = value_of_variable (sym, NULL);
2411 gdb_assert_not_reached ("unexpected field location kind");
2417 /* Change the enclosing type of a value object VAL to NEW_ENCL_TYPE.
2418 You have to be careful here, since the size of the data area for the value
2419 is set by the length of the enclosing type. So if NEW_ENCL_TYPE is bigger
2420 than the old enclosing type, you have to allocate more space for the
2424 set_value_enclosing_type (struct value *val, struct type *new_encl_type)
2426 if (TYPE_LENGTH (new_encl_type) > TYPE_LENGTH (value_enclosing_type (val)))
2428 (gdb_byte *) xrealloc (val->contents, TYPE_LENGTH (new_encl_type));
2430 val->enclosing_type = new_encl_type;
2433 /* Given a value ARG1 (offset by OFFSET bytes)
2434 of a struct or union type ARG_TYPE,
2435 extract and return the value of one of its (non-static) fields.
2436 FIELDNO says which field. */
2439 value_primitive_field (struct value *arg1, int offset,
2440 int fieldno, struct type *arg_type)
2445 CHECK_TYPEDEF (arg_type);
2446 type = TYPE_FIELD_TYPE (arg_type, fieldno);
2448 /* Call check_typedef on our type to make sure that, if TYPE
2449 is a TYPE_CODE_TYPEDEF, its length is set to the length
2450 of the target type instead of zero. However, we do not
2451 replace the typedef type by the target type, because we want
2452 to keep the typedef in order to be able to print the type
2453 description correctly. */
2454 check_typedef (type);
2456 /* Handle packed fields */
2458 if (TYPE_FIELD_BITSIZE (arg_type, fieldno))
2460 /* Create a new value for the bitfield, with bitpos and bitsize
2461 set. If possible, arrange offset and bitpos so that we can
2462 do a single aligned read of the size of the containing type.
2463 Otherwise, adjust offset to the byte containing the first
2464 bit. Assume that the address, offset, and embedded offset
2465 are sufficiently aligned. */
2466 int bitpos = TYPE_FIELD_BITPOS (arg_type, fieldno);
2467 int container_bitsize = TYPE_LENGTH (type) * 8;
2469 v = allocate_value_lazy (type);
2470 v->bitsize = TYPE_FIELD_BITSIZE (arg_type, fieldno);
2471 if ((bitpos % container_bitsize) + v->bitsize <= container_bitsize
2472 && TYPE_LENGTH (type) <= (int) sizeof (LONGEST))
2473 v->bitpos = bitpos % container_bitsize;
2475 v->bitpos = bitpos % 8;
2476 v->offset = (value_embedded_offset (arg1)
2478 + (bitpos - v->bitpos) / 8);
2480 value_incref (v->parent);
2481 if (!value_lazy (arg1))
2482 value_fetch_lazy (v);
2484 else if (fieldno < TYPE_N_BASECLASSES (arg_type))
2486 /* This field is actually a base subobject, so preserve the
2487 entire object's contents for later references to virtual
2490 /* Lazy register values with offsets are not supported. */
2491 if (VALUE_LVAL (arg1) == lval_register && value_lazy (arg1))
2492 value_fetch_lazy (arg1);
2494 if (value_lazy (arg1))
2495 v = allocate_value_lazy (value_enclosing_type (arg1));
2498 v = allocate_value (value_enclosing_type (arg1));
2499 value_contents_copy_raw (v, 0, arg1, 0,
2500 TYPE_LENGTH (value_enclosing_type (arg1)));
2503 v->offset = value_offset (arg1);
2504 v->embedded_offset = (offset + value_embedded_offset (arg1)
2505 + TYPE_FIELD_BITPOS (arg_type, fieldno) / 8);
2509 /* Plain old data member */
2510 offset += TYPE_FIELD_BITPOS (arg_type, fieldno) / 8;
2512 /* Lazy register values with offsets are not supported. */
2513 if (VALUE_LVAL (arg1) == lval_register && value_lazy (arg1))
2514 value_fetch_lazy (arg1);
2516 if (value_lazy (arg1))
2517 v = allocate_value_lazy (type);
2520 v = allocate_value (type);
2521 value_contents_copy_raw (v, value_embedded_offset (v),
2522 arg1, value_embedded_offset (arg1) + offset,
2523 TYPE_LENGTH (type));
2525 v->offset = (value_offset (arg1) + offset
2526 + value_embedded_offset (arg1));
2528 set_value_component_location (v, arg1);
2529 VALUE_REGNUM (v) = VALUE_REGNUM (arg1);
2530 VALUE_FRAME_ID (v) = VALUE_FRAME_ID (arg1);
2534 /* Given a value ARG1 of a struct or union type,
2535 extract and return the value of one of its (non-static) fields.
2536 FIELDNO says which field. */
2539 value_field (struct value *arg1, int fieldno)
2541 return value_primitive_field (arg1, 0, fieldno, value_type (arg1));
2544 /* Return a non-virtual function as a value.
2545 F is the list of member functions which contains the desired method.
2546 J is an index into F which provides the desired method.
2548 We only use the symbol for its address, so be happy with either a
2549 full symbol or a minimal symbol. */
2552 value_fn_field (struct value **arg1p, struct fn_field *f,
2553 int j, struct type *type,
2557 struct type *ftype = TYPE_FN_FIELD_TYPE (f, j);
2558 char *physname = TYPE_FN_FIELD_PHYSNAME (f, j);
2560 struct minimal_symbol *msym;
2562 sym = lookup_symbol (physname, 0, VAR_DOMAIN, 0);
2569 gdb_assert (sym == NULL);
2570 msym = lookup_minimal_symbol (physname, NULL, NULL);
2575 v = allocate_value (ftype);
2578 set_value_address (v, BLOCK_START (SYMBOL_BLOCK_VALUE (sym)));
2582 /* The minimal symbol might point to a function descriptor;
2583 resolve it to the actual code address instead. */
2584 struct objfile *objfile = msymbol_objfile (msym);
2585 struct gdbarch *gdbarch = get_objfile_arch (objfile);
2587 set_value_address (v,
2588 gdbarch_convert_from_func_ptr_addr
2589 (gdbarch, SYMBOL_VALUE_ADDRESS (msym), ¤t_target));
2594 if (type != value_type (*arg1p))
2595 *arg1p = value_ind (value_cast (lookup_pointer_type (type),
2596 value_addr (*arg1p)));
2598 /* Move the `this' pointer according to the offset.
2599 VALUE_OFFSET (*arg1p) += offset; */
2607 /* Helper function for both unpack_value_bits_as_long and
2608 unpack_bits_as_long. See those functions for more details on the
2609 interface; the only difference is that this function accepts either
2610 a NULL or a non-NULL ORIGINAL_VALUE. */
2613 unpack_value_bits_as_long_1 (struct type *field_type, const gdb_byte *valaddr,
2614 int embedded_offset, int bitpos, int bitsize,
2615 const struct value *original_value,
2618 enum bfd_endian byte_order = gdbarch_byte_order (get_type_arch (field_type));
2625 /* Read the minimum number of bytes required; there may not be
2626 enough bytes to read an entire ULONGEST. */
2627 CHECK_TYPEDEF (field_type);
2629 bytes_read = ((bitpos % 8) + bitsize + 7) / 8;
2631 bytes_read = TYPE_LENGTH (field_type);
2633 read_offset = bitpos / 8;
2635 if (original_value != NULL
2636 && !value_bytes_available (original_value, embedded_offset + read_offset,
2640 val = extract_unsigned_integer (valaddr + embedded_offset + read_offset,
2641 bytes_read, byte_order);
2643 /* Extract bits. See comment above. */
2645 if (gdbarch_bits_big_endian (get_type_arch (field_type)))
2646 lsbcount = (bytes_read * 8 - bitpos % 8 - bitsize);
2648 lsbcount = (bitpos % 8);
2651 /* If the field does not entirely fill a LONGEST, then zero the sign bits.
2652 If the field is signed, and is negative, then sign extend. */
2654 if ((bitsize > 0) && (bitsize < 8 * (int) sizeof (val)))
2656 valmask = (((ULONGEST) 1) << bitsize) - 1;
2658 if (!TYPE_UNSIGNED (field_type))
2660 if (val & (valmask ^ (valmask >> 1)))
2671 /* Unpack a bitfield of the specified FIELD_TYPE, from the object at
2672 VALADDR + EMBEDDED_OFFSET, and store the result in *RESULT.
2673 VALADDR points to the contents of ORIGINAL_VALUE, which must not be
2674 NULL. The bitfield starts at BITPOS bits and contains BITSIZE
2677 Returns false if the value contents are unavailable, otherwise
2678 returns true, indicating a valid value has been stored in *RESULT.
2680 Extracting bits depends on endianness of the machine. Compute the
2681 number of least significant bits to discard. For big endian machines,
2682 we compute the total number of bits in the anonymous object, subtract
2683 off the bit count from the MSB of the object to the MSB of the
2684 bitfield, then the size of the bitfield, which leaves the LSB discard
2685 count. For little endian machines, the discard count is simply the
2686 number of bits from the LSB of the anonymous object to the LSB of the
2689 If the field is signed, we also do sign extension. */
2692 unpack_value_bits_as_long (struct type *field_type, const gdb_byte *valaddr,
2693 int embedded_offset, int bitpos, int bitsize,
2694 const struct value *original_value,
2697 gdb_assert (original_value != NULL);
2699 return unpack_value_bits_as_long_1 (field_type, valaddr, embedded_offset,
2700 bitpos, bitsize, original_value, result);
2704 /* Unpack a field FIELDNO of the specified TYPE, from the object at
2705 VALADDR + EMBEDDED_OFFSET. VALADDR points to the contents of
2706 ORIGINAL_VALUE. See unpack_value_bits_as_long for more
2710 unpack_value_field_as_long_1 (struct type *type, const gdb_byte *valaddr,
2711 int embedded_offset, int fieldno,
2712 const struct value *val, LONGEST *result)
2714 int bitpos = TYPE_FIELD_BITPOS (type, fieldno);
2715 int bitsize = TYPE_FIELD_BITSIZE (type, fieldno);
2716 struct type *field_type = TYPE_FIELD_TYPE (type, fieldno);
2718 return unpack_value_bits_as_long_1 (field_type, valaddr, embedded_offset,
2719 bitpos, bitsize, val,
2723 /* Unpack a field FIELDNO of the specified TYPE, from the object at
2724 VALADDR + EMBEDDED_OFFSET. VALADDR points to the contents of
2725 ORIGINAL_VALUE, which must not be NULL. See
2726 unpack_value_bits_as_long for more details. */
2729 unpack_value_field_as_long (struct type *type, const gdb_byte *valaddr,
2730 int embedded_offset, int fieldno,
2731 const struct value *val, LONGEST *result)
2733 gdb_assert (val != NULL);
2735 return unpack_value_field_as_long_1 (type, valaddr, embedded_offset,
2736 fieldno, val, result);
2739 /* Unpack a field FIELDNO of the specified TYPE, from the anonymous
2740 object at VALADDR. See unpack_value_bits_as_long for more details.
2741 This function differs from unpack_value_field_as_long in that it
2742 operates without a struct value object. */
2745 unpack_field_as_long (struct type *type, const gdb_byte *valaddr, int fieldno)
2749 unpack_value_field_as_long_1 (type, valaddr, 0, fieldno, NULL, &result);
2753 /* Return a new value with type TYPE, which is FIELDNO field of the
2754 object at VALADDR + EMBEDDEDOFFSET. VALADDR points to the contents
2755 of VAL. If the VAL's contents required to extract the bitfield
2756 from are unavailable, the new value is correspondingly marked as
2760 value_field_bitfield (struct type *type, int fieldno,
2761 const gdb_byte *valaddr,
2762 int embedded_offset, const struct value *val)
2766 if (!unpack_value_field_as_long (type, valaddr, embedded_offset, fieldno,
2769 struct type *field_type = TYPE_FIELD_TYPE (type, fieldno);
2770 struct value *retval = allocate_value (field_type);
2771 mark_value_bytes_unavailable (retval, 0, TYPE_LENGTH (field_type));
2776 return value_from_longest (TYPE_FIELD_TYPE (type, fieldno), l);
2780 /* Modify the value of a bitfield. ADDR points to a block of memory in
2781 target byte order; the bitfield starts in the byte pointed to. FIELDVAL
2782 is the desired value of the field, in host byte order. BITPOS and BITSIZE
2783 indicate which bits (in target bit order) comprise the bitfield.
2784 Requires 0 < BITSIZE <= lbits, 0 <= BITPOS % 8 + BITSIZE <= lbits, and
2785 0 <= BITPOS, where lbits is the size of a LONGEST in bits. */
2788 modify_field (struct type *type, gdb_byte *addr,
2789 LONGEST fieldval, int bitpos, int bitsize)
2791 enum bfd_endian byte_order = gdbarch_byte_order (get_type_arch (type));
2793 ULONGEST mask = (ULONGEST) -1 >> (8 * sizeof (ULONGEST) - bitsize);
2796 /* Normalize BITPOS. */
2800 /* If a negative fieldval fits in the field in question, chop
2801 off the sign extension bits. */
2802 if ((~fieldval & ~(mask >> 1)) == 0)
2805 /* Warn if value is too big to fit in the field in question. */
2806 if (0 != (fieldval & ~mask))
2808 /* FIXME: would like to include fieldval in the message, but
2809 we don't have a sprintf_longest. */
2810 warning (_("Value does not fit in %d bits."), bitsize);
2812 /* Truncate it, otherwise adjoining fields may be corrupted. */
2816 /* Ensure no bytes outside of the modified ones get accessed as it may cause
2817 false valgrind reports. */
2819 bytesize = (bitpos + bitsize + 7) / 8;
2820 oword = extract_unsigned_integer (addr, bytesize, byte_order);
2822 /* Shifting for bit field depends on endianness of the target machine. */
2823 if (gdbarch_bits_big_endian (get_type_arch (type)))
2824 bitpos = bytesize * 8 - bitpos - bitsize;
2826 oword &= ~(mask << bitpos);
2827 oword |= fieldval << bitpos;
2829 store_unsigned_integer (addr, bytesize, byte_order, oword);
2832 /* Pack NUM into BUF using a target format of TYPE. */
2835 pack_long (gdb_byte *buf, struct type *type, LONGEST num)
2837 enum bfd_endian byte_order = gdbarch_byte_order (get_type_arch (type));
2840 type = check_typedef (type);
2841 len = TYPE_LENGTH (type);
2843 switch (TYPE_CODE (type))
2846 case TYPE_CODE_CHAR:
2847 case TYPE_CODE_ENUM:
2848 case TYPE_CODE_FLAGS:
2849 case TYPE_CODE_BOOL:
2850 case TYPE_CODE_RANGE:
2851 case TYPE_CODE_MEMBERPTR:
2852 store_signed_integer (buf, len, byte_order, num);
2857 store_typed_address (buf, type, (CORE_ADDR) num);
2861 error (_("Unexpected type (%d) encountered for integer constant."),
2867 /* Pack NUM into BUF using a target format of TYPE. */
2870 pack_unsigned_long (gdb_byte *buf, struct type *type, ULONGEST num)
2873 enum bfd_endian byte_order;
2875 type = check_typedef (type);
2876 len = TYPE_LENGTH (type);
2877 byte_order = gdbarch_byte_order (get_type_arch (type));
2879 switch (TYPE_CODE (type))
2882 case TYPE_CODE_CHAR:
2883 case TYPE_CODE_ENUM:
2884 case TYPE_CODE_FLAGS:
2885 case TYPE_CODE_BOOL:
2886 case TYPE_CODE_RANGE:
2887 case TYPE_CODE_MEMBERPTR:
2888 store_unsigned_integer (buf, len, byte_order, num);
2893 store_typed_address (buf, type, (CORE_ADDR) num);
2897 error (_("Unexpected type (%d) encountered "
2898 "for unsigned integer constant."),
2904 /* Convert C numbers into newly allocated values. */
2907 value_from_longest (struct type *type, LONGEST num)
2909 struct value *val = allocate_value (type);
2911 pack_long (value_contents_raw (val), type, num);
2916 /* Convert C unsigned numbers into newly allocated values. */
2919 value_from_ulongest (struct type *type, ULONGEST num)
2921 struct value *val = allocate_value (type);
2923 pack_unsigned_long (value_contents_raw (val), type, num);
2929 /* Create a value representing a pointer of type TYPE to the address
2932 value_from_pointer (struct type *type, CORE_ADDR addr)
2934 struct value *val = allocate_value (type);
2936 store_typed_address (value_contents_raw (val), check_typedef (type), addr);
2941 /* Create a value of type TYPE whose contents come from VALADDR, if it
2942 is non-null, and whose memory address (in the inferior) is
2946 value_from_contents_and_address (struct type *type,
2947 const gdb_byte *valaddr,
2952 if (valaddr == NULL)
2953 v = allocate_value_lazy (type);
2956 v = allocate_value (type);
2957 memcpy (value_contents_raw (v), valaddr, TYPE_LENGTH (type));
2959 set_value_address (v, address);
2960 VALUE_LVAL (v) = lval_memory;
2965 value_from_double (struct type *type, DOUBLEST num)
2967 struct value *val = allocate_value (type);
2968 struct type *base_type = check_typedef (type);
2969 enum type_code code = TYPE_CODE (base_type);
2971 if (code == TYPE_CODE_FLT)
2973 store_typed_floating (value_contents_raw (val), base_type, num);
2976 error (_("Unexpected type encountered for floating constant."));
2982 value_from_decfloat (struct type *type, const gdb_byte *dec)
2984 struct value *val = allocate_value (type);
2986 memcpy (value_contents_raw (val), dec, TYPE_LENGTH (type));
2991 coerce_ref (struct value *arg)
2993 struct type *value_type_arg_tmp = check_typedef (value_type (arg));
2995 if (TYPE_CODE (value_type_arg_tmp) == TYPE_CODE_REF)
2996 arg = value_at_lazy (TYPE_TARGET_TYPE (value_type_arg_tmp),
2997 unpack_pointer (value_type (arg),
2998 value_contents (arg)));
3003 coerce_array (struct value *arg)
3007 arg = coerce_ref (arg);
3008 type = check_typedef (value_type (arg));
3010 switch (TYPE_CODE (type))
3012 case TYPE_CODE_ARRAY:
3013 if (!TYPE_VECTOR (type) && current_language->c_style_arrays)
3014 arg = value_coerce_array (arg);
3016 case TYPE_CODE_FUNC:
3017 arg = value_coerce_function (arg);
3024 /* Return true if the function returning the specified type is using
3025 the convention of returning structures in memory (passing in the
3026 address as a hidden first parameter). */
3029 using_struct_return (struct gdbarch *gdbarch,
3030 struct type *func_type, struct type *value_type)
3032 enum type_code code = TYPE_CODE (value_type);
3034 if (code == TYPE_CODE_ERROR)
3035 error (_("Function return type unknown."));
3037 if (code == TYPE_CODE_VOID)
3038 /* A void return value is never in memory. See also corresponding
3039 code in "print_return_value". */
3042 /* Probe the architecture for the return-value convention. */
3043 return (gdbarch_return_value (gdbarch, func_type, value_type,
3045 != RETURN_VALUE_REGISTER_CONVENTION);
3048 /* Set the initialized field in a value struct. */
3051 set_value_initialized (struct value *val, int status)
3053 val->initialized = status;
3056 /* Return the initialized field in a value struct. */
3059 value_initialized (struct value *val)
3061 return val->initialized;
3065 _initialize_values (void)
3067 add_cmd ("convenience", no_class, show_convenience, _("\
3068 Debugger convenience (\"$foo\") variables.\n\
3069 These variables are created when you assign them values;\n\
3070 thus, \"print $foo=1\" gives \"$foo\" the value 1. Values may be any type.\n\
3072 A few convenience variables are given values automatically:\n\
3073 \"$_\"holds the last address examined with \"x\" or \"info lines\",\n\
3074 \"$__\" holds the contents of the last address examined with \"x\"."),
3077 add_cmd ("values", no_set_class, show_values, _("\
3078 Elements of value history around item number IDX (or last ten)."),
3081 add_com ("init-if-undefined", class_vars, init_if_undefined_command, _("\
3082 Initialize a convenience variable if necessary.\n\
3083 init-if-undefined VARIABLE = EXPRESSION\n\
3084 Set an internal VARIABLE to the result of the EXPRESSION if it does not\n\
3085 exist or does not contain a value. The EXPRESSION is not evaluated if the\n\
3086 VARIABLE is already initialized."));
3088 add_prefix_cmd ("function", no_class, function_command, _("\
3089 Placeholder command for showing help on convenience functions."),
3090 &functionlist, "function ", 0, &cmdlist);