Home | History | Annotate | Download | only in libdw
      1 /* This file defines standard DWARF types, structures, and macros.
      2    Copyright (C) 2000-2011, 2014, 2016, 2017, 2018 Red Hat, Inc.
      3    This file is part of elfutils.
      4 
      5    This file is free software; you can redistribute it and/or modify
      6    it under the terms of either
      7 
      8      * the GNU Lesser General Public License as published by the Free
      9        Software Foundation; either version 3 of the License, or (at
     10        your option) any later version
     11 
     12    or
     13 
     14      * the GNU General Public License as published by the Free
     15        Software Foundation; either version 2 of the License, or (at
     16        your option) any later version
     17 
     18    or both in parallel, as here.
     19 
     20    elfutils is distributed in the hope that it will be useful, but
     21    WITHOUT ANY WARRANTY; without even the implied warranty of
     22    MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the GNU
     23    General Public License for more details.
     24 
     25    You should have received copies of the GNU General Public License and
     26    the GNU Lesser General Public License along with this program.  If
     27    not, see <http://www.gnu.org/licenses/>.  */
     28 
     29 #ifndef _DWARF_H
     30 #define	_DWARF_H 1
     31 
     32 /* DWARF Unit Header Types.  */
     33 enum
     34   {
     35     DW_UT_compile = 0x01,
     36     DW_UT_type = 0x02,
     37     DW_UT_partial = 0x03,
     38     DW_UT_skeleton = 0x04,
     39     DW_UT_split_compile = 0x05,
     40     DW_UT_split_type = 0x06,
     41 
     42     DW_UT_lo_user = 0x80,
     43     DW_UT_hi_user = 0xff
     44   };
     45 
     46 /* DWARF tags.  */
     47 enum
     48   {
     49     DW_TAG_array_type = 0x01,
     50     DW_TAG_class_type = 0x02,
     51     DW_TAG_entry_point = 0x03,
     52     DW_TAG_enumeration_type = 0x04,
     53     DW_TAG_formal_parameter = 0x05,
     54     /* 0x06 reserved.  */
     55     /* 0x07 reserved.  */
     56     DW_TAG_imported_declaration = 0x08,
     57     /* 0x09 reserved.  */
     58     DW_TAG_label = 0x0a,
     59     DW_TAG_lexical_block = 0x0b,
     60     /* 0x0c reserved.  */
     61     DW_TAG_member = 0x0d,
     62     /* 0x0e reserved.  */
     63     DW_TAG_pointer_type = 0x0f,
     64     DW_TAG_reference_type = 0x10,
     65     DW_TAG_compile_unit = 0x11,
     66     DW_TAG_string_type = 0x12,
     67     DW_TAG_structure_type = 0x13,
     68     /* 0x14 reserved.  */
     69     DW_TAG_subroutine_type = 0x15,
     70     DW_TAG_typedef = 0x16,
     71     DW_TAG_union_type = 0x17,
     72     DW_TAG_unspecified_parameters = 0x18,
     73     DW_TAG_variant = 0x19,
     74     DW_TAG_common_block = 0x1a,
     75     DW_TAG_common_inclusion = 0x1b,
     76     DW_TAG_inheritance = 0x1c,
     77     DW_TAG_inlined_subroutine = 0x1d,
     78     DW_TAG_module = 0x1e,
     79     DW_TAG_ptr_to_member_type = 0x1f,
     80     DW_TAG_set_type = 0x20,
     81     DW_TAG_subrange_type = 0x21,
     82     DW_TAG_with_stmt = 0x22,
     83     DW_TAG_access_declaration = 0x23,
     84     DW_TAG_base_type = 0x24,
     85     DW_TAG_catch_block = 0x25,
     86     DW_TAG_const_type = 0x26,
     87     DW_TAG_constant = 0x27,
     88     DW_TAG_enumerator = 0x28,
     89     DW_TAG_file_type = 0x29,
     90     DW_TAG_friend = 0x2a,
     91     DW_TAG_namelist = 0x2b,
     92     DW_TAG_namelist_item = 0x2c,
     93     DW_TAG_packed_type = 0x2d,
     94     DW_TAG_subprogram = 0x2e,
     95     DW_TAG_template_type_parameter = 0x2f,
     96     DW_TAG_template_value_parameter = 0x30,
     97     DW_TAG_thrown_type = 0x31,
     98     DW_TAG_try_block = 0x32,
     99     DW_TAG_variant_part = 0x33,
    100     DW_TAG_variable = 0x34,
    101     DW_TAG_volatile_type = 0x35,
    102     DW_TAG_dwarf_procedure = 0x36,
    103     DW_TAG_restrict_type = 0x37,
    104     DW_TAG_interface_type = 0x38,
    105     DW_TAG_namespace = 0x39,
    106     DW_TAG_imported_module = 0x3a,
    107     DW_TAG_unspecified_type = 0x3b,
    108     DW_TAG_partial_unit = 0x3c,
    109     DW_TAG_imported_unit = 0x3d,
    110     /* 0x3e reserved.  Was DW_TAG_mutable_type.  */
    111     DW_TAG_condition = 0x3f,
    112     DW_TAG_shared_type = 0x40,
    113     DW_TAG_type_unit = 0x41,
    114     DW_TAG_rvalue_reference_type = 0x42,
    115     DW_TAG_template_alias = 0x43,
    116     DW_TAG_coarray_type = 0x44,
    117     DW_TAG_generic_subrange = 0x45,
    118     DW_TAG_dynamic_type = 0x46,
    119     DW_TAG_atomic_type = 0x47,
    120     DW_TAG_call_site = 0x48,
    121     DW_TAG_call_site_parameter = 0x49,
    122     DW_TAG_skeleton_unit = 0x4a,
    123     DW_TAG_immutable_type = 0x4b,
    124 
    125     DW_TAG_lo_user = 0x4080,
    126 
    127     DW_TAG_MIPS_loop = 0x4081,
    128     DW_TAG_format_label = 0x4101,
    129     DW_TAG_function_template = 0x4102,
    130     DW_TAG_class_template = 0x4103,
    131 
    132     DW_TAG_GNU_BINCL = 0x4104,
    133     DW_TAG_GNU_EINCL = 0x4105,
    134 
    135     DW_TAG_GNU_template_template_param = 0x4106,
    136     DW_TAG_GNU_template_parameter_pack = 0x4107,
    137     DW_TAG_GNU_formal_parameter_pack = 0x4108,
    138     DW_TAG_GNU_call_site = 0x4109,
    139     DW_TAG_GNU_call_site_parameter = 0x410a,
    140 
    141     DW_TAG_hi_user = 0xffff
    142   };
    143 
    144 
    145 /* Children determination encodings.  */
    146 enum
    147   {
    148     DW_CHILDREN_no = 0,
    149     DW_CHILDREN_yes = 1
    150   };
    151 
    152 
    153 /* DWARF attributes encodings.  */
    154 enum
    155   {
    156     DW_AT_sibling = 0x01,
    157     DW_AT_location = 0x02,
    158     DW_AT_name = 0x03,
    159     /* 0x04 reserved.  */
    160     /* 0x05 reserved.  */
    161     /* 0x06 reserved.  */
    162     /* 0x07 reserved.  */
    163     /* 0x08 reserved.  */
    164     DW_AT_ordering = 0x09,
    165     /* 0x0a reserved.  */
    166     DW_AT_byte_size = 0x0b,
    167     DW_AT_bit_offset = 0x0c,  /* Deprecated in DWARF4.  */
    168     DW_AT_bit_size = 0x0d,
    169     /* 0x0e reserved.  */
    170     /* 0x0f reserved.  */
    171     DW_AT_stmt_list = 0x10,
    172     DW_AT_low_pc = 0x11,
    173     DW_AT_high_pc = 0x12,
    174     DW_AT_language = 0x13,
    175     /* 0x14 reserved.  */
    176     DW_AT_discr = 0x15,
    177     DW_AT_discr_value = 0x16,
    178     DW_AT_visibility = 0x17,
    179     DW_AT_import = 0x18,
    180     DW_AT_string_length = 0x19,
    181     DW_AT_common_reference = 0x1a,
    182     DW_AT_comp_dir = 0x1b,
    183     DW_AT_const_value = 0x1c,
    184     DW_AT_containing_type = 0x1d,
    185     DW_AT_default_value = 0x1e,
    186     /* 0x1f reserved.  */
    187     DW_AT_inline = 0x20,
    188     DW_AT_is_optional = 0x21,
    189     DW_AT_lower_bound = 0x22,
    190     /* 0x23 reserved.  */
    191     /* 0x24 reserved.  */
    192     DW_AT_producer = 0x25,
    193     /* 0x26 reserved.  */
    194     DW_AT_prototyped = 0x27,
    195     /* 0x28 reserved.  */
    196     /* 0x29 reserved.  */
    197     DW_AT_return_addr = 0x2a,
    198     /* 0x2b reserved.  */
    199     DW_AT_start_scope = 0x2c,
    200     /* 0x2d reserved.  */
    201     DW_AT_bit_stride = 0x2e,
    202     DW_AT_upper_bound = 0x2f,
    203     /* 0x30 reserved.  */
    204     DW_AT_abstract_origin = 0x31,
    205     DW_AT_accessibility = 0x32,
    206     DW_AT_address_class = 0x33,
    207     DW_AT_artificial = 0x34,
    208     DW_AT_base_types = 0x35,
    209     DW_AT_calling_convention = 0x36,
    210     DW_AT_count = 0x37,
    211     DW_AT_data_member_location = 0x38,
    212     DW_AT_decl_column = 0x39,
    213     DW_AT_decl_file = 0x3a,
    214     DW_AT_decl_line = 0x3b,
    215     DW_AT_declaration = 0x3c,
    216     DW_AT_discr_list = 0x3d,
    217     DW_AT_encoding = 0x3e,
    218     DW_AT_external = 0x3f,
    219     DW_AT_frame_base = 0x40,
    220     DW_AT_friend = 0x41,
    221     DW_AT_identifier_case = 0x42,
    222     DW_AT_macro_info = 0x43, /* Deprecated in DWARF5.  */
    223     DW_AT_namelist_item = 0x44,
    224     DW_AT_priority = 0x45,
    225     DW_AT_segment = 0x46,
    226     DW_AT_specification = 0x47,
    227     DW_AT_static_link = 0x48,
    228     DW_AT_type = 0x49,
    229     DW_AT_use_location = 0x4a,
    230     DW_AT_variable_parameter = 0x4b,
    231     DW_AT_virtuality = 0x4c,
    232     DW_AT_vtable_elem_location = 0x4d,
    233     DW_AT_allocated = 0x4e,
    234     DW_AT_associated = 0x4f,
    235     DW_AT_data_location = 0x50,
    236     DW_AT_byte_stride = 0x51,
    237     DW_AT_entry_pc = 0x52,
    238     DW_AT_use_UTF8 = 0x53,
    239     DW_AT_extension = 0x54,
    240     DW_AT_ranges = 0x55,
    241     DW_AT_trampoline = 0x56,
    242     DW_AT_call_column = 0x57,
    243     DW_AT_call_file = 0x58,
    244     DW_AT_call_line = 0x59,
    245     DW_AT_description = 0x5a,
    246     DW_AT_binary_scale = 0x5b,
    247     DW_AT_decimal_scale = 0x5c,
    248     DW_AT_small = 0x5d,
    249     DW_AT_decimal_sign = 0x5e,
    250     DW_AT_digit_count = 0x5f,
    251     DW_AT_picture_string = 0x60,
    252     DW_AT_mutable = 0x61,
    253     DW_AT_threads_scaled = 0x62,
    254     DW_AT_explicit = 0x63,
    255     DW_AT_object_pointer = 0x64,
    256     DW_AT_endianity = 0x65,
    257     DW_AT_elemental = 0x66,
    258     DW_AT_pure = 0x67,
    259     DW_AT_recursive = 0x68,
    260     DW_AT_signature = 0x69,
    261     DW_AT_main_subprogram = 0x6a,
    262     DW_AT_data_bit_offset = 0x6b,
    263     DW_AT_const_expr = 0x6c,
    264     DW_AT_enum_class = 0x6d,
    265     DW_AT_linkage_name = 0x6e,
    266     DW_AT_string_length_bit_size = 0x6f,
    267     DW_AT_string_length_byte_size = 0x70,
    268     DW_AT_rank = 0x71,
    269     DW_AT_str_offsets_base = 0x72,
    270     DW_AT_addr_base = 0x73,
    271     DW_AT_rnglists_base = 0x74,
    272     /* 0x75 reserved.  */
    273     DW_AT_dwo_name = 0x76,
    274     DW_AT_reference = 0x77,
    275     DW_AT_rvalue_reference = 0x78,
    276     DW_AT_macros = 0x79,
    277     DW_AT_call_all_calls = 0x7a,
    278     DW_AT_call_all_source_calls = 0x7b,
    279     DW_AT_call_all_tail_calls = 0x7c,
    280     DW_AT_call_return_pc = 0x7d,
    281     DW_AT_call_value = 0x7e,
    282     DW_AT_call_origin = 0x7f,
    283     DW_AT_call_parameter = 0x80,
    284     DW_AT_call_pc = 0x81,
    285     DW_AT_call_tail_call = 0x82,
    286     DW_AT_call_target = 0x83,
    287     DW_AT_call_target_clobbered = 0x84,
    288     DW_AT_call_data_location = 0x85,
    289     DW_AT_call_data_value = 0x86,
    290     DW_AT_noreturn = 0x87,
    291     DW_AT_alignment = 0x88,
    292     DW_AT_export_symbols = 0x89,
    293     DW_AT_deleted = 0x8a,
    294     DW_AT_defaulted = 0x8b,
    295     DW_AT_loclists_base = 0x8c,
    296 
    297     DW_AT_lo_user = 0x2000,
    298 
    299     DW_AT_MIPS_fde = 0x2001,
    300     DW_AT_MIPS_loop_begin = 0x2002,
    301     DW_AT_MIPS_tail_loop_begin = 0x2003,
    302     DW_AT_MIPS_epilog_begin = 0x2004,
    303     DW_AT_MIPS_loop_unroll_factor = 0x2005,
    304     DW_AT_MIPS_software_pipeline_depth = 0x2006,
    305     DW_AT_MIPS_linkage_name = 0x2007,
    306     DW_AT_MIPS_stride = 0x2008,
    307     DW_AT_MIPS_abstract_name = 0x2009,
    308     DW_AT_MIPS_clone_origin = 0x200a,
    309     DW_AT_MIPS_has_inlines = 0x200b,
    310     DW_AT_MIPS_stride_byte = 0x200c,
    311     DW_AT_MIPS_stride_elem = 0x200d,
    312     DW_AT_MIPS_ptr_dopetype = 0x200e,
    313     DW_AT_MIPS_allocatable_dopetype = 0x200f,
    314     DW_AT_MIPS_assumed_shape_dopetype = 0x2010,
    315     DW_AT_MIPS_assumed_size = 0x2011,
    316 
    317     /* GNU extensions.  */
    318     DW_AT_sf_names = 0x2101,
    319     DW_AT_src_info = 0x2102,
    320     DW_AT_mac_info = 0x2103,
    321     DW_AT_src_coords = 0x2104,
    322     DW_AT_body_begin = 0x2105,
    323     DW_AT_body_end = 0x2106,
    324     DW_AT_GNU_vector = 0x2107,
    325     DW_AT_GNU_guarded_by = 0x2108,
    326     DW_AT_GNU_pt_guarded_by = 0x2109,
    327     DW_AT_GNU_guarded = 0x210a,
    328     DW_AT_GNU_pt_guarded = 0x210b,
    329     DW_AT_GNU_locks_excluded = 0x210c,
    330     DW_AT_GNU_exclusive_locks_required = 0x210d,
    331     DW_AT_GNU_shared_locks_required = 0x210e,
    332     DW_AT_GNU_odr_signature = 0x210f,
    333     DW_AT_GNU_template_name = 0x2110,
    334     DW_AT_GNU_call_site_value = 0x2111,
    335     DW_AT_GNU_call_site_data_value = 0x2112,
    336     DW_AT_GNU_call_site_target = 0x2113,
    337     DW_AT_GNU_call_site_target_clobbered = 0x2114,
    338     DW_AT_GNU_tail_call = 0x2115,
    339     DW_AT_GNU_all_tail_call_sites = 0x2116,
    340     DW_AT_GNU_all_call_sites = 0x2117,
    341     DW_AT_GNU_all_source_call_sites = 0x2118,
    342     DW_AT_GNU_locviews = 0x2137,
    343     DW_AT_GNU_entry_view = 0x2138,
    344     DW_AT_GNU_macros = 0x2119,
    345     DW_AT_GNU_deleted = 0x211a,
    346     /* GNU Debug Fission extensions.  */
    347     DW_AT_GNU_dwo_name = 0x2130,
    348     DW_AT_GNU_dwo_id = 0x2131,
    349     DW_AT_GNU_ranges_base = 0x2132,
    350     DW_AT_GNU_addr_base = 0x2133,
    351     DW_AT_GNU_pubnames = 0x2134,
    352     DW_AT_GNU_pubtypes = 0x2135,
    353 
    354     DW_AT_hi_user = 0x3fff
    355   };
    356 
    357 /* Old unofficially attribute names.  Should not be used.
    358    Will not appear in known-dwarf.h  */
    359 
    360 /* DWARF1 array subscripts and element data types.  */
    361 #define DW_AT_subscr_data	0x0a
    362 /* DWARF1 enumeration literals.  */
    363 #define DW_AT_element_list	0x0f
    364 /* DWARF1 reference for variable to member structure, class or union.  */
    365 #define DW_AT_member		0x14
    366 
    367 /* DWARF form encodings.  */
    368 enum
    369   {
    370     DW_FORM_addr = 0x01,
    371     DW_FORM_block2 = 0x03,
    372     DW_FORM_block4 = 0x04,
    373     DW_FORM_data2 = 0x05,
    374     DW_FORM_data4 = 0x06,
    375     DW_FORM_data8 = 0x07,
    376     DW_FORM_string = 0x08,
    377     DW_FORM_block = 0x09,
    378     DW_FORM_block1 = 0x0a,
    379     DW_FORM_data1 = 0x0b,
    380     DW_FORM_flag = 0x0c,
    381     DW_FORM_sdata = 0x0d,
    382     DW_FORM_strp = 0x0e,
    383     DW_FORM_udata = 0x0f,
    384     DW_FORM_ref_addr = 0x10,
    385     DW_FORM_ref1 = 0x11,
    386     DW_FORM_ref2 = 0x12,
    387     DW_FORM_ref4 = 0x13,
    388     DW_FORM_ref8 = 0x14,
    389     DW_FORM_ref_udata = 0x15,
    390     DW_FORM_indirect = 0x16,
    391     DW_FORM_sec_offset = 0x17,
    392     DW_FORM_exprloc = 0x18,
    393     DW_FORM_flag_present = 0x19,
    394     DW_FORM_strx = 0x1a,
    395     DW_FORM_addrx = 0x1b,
    396     DW_FORM_ref_sup4 = 0x1c,
    397     DW_FORM_strp_sup = 0x1d,
    398     DW_FORM_data16 = 0x1e,
    399     DW_FORM_line_strp = 0x1f,
    400     DW_FORM_ref_sig8 = 0x20,
    401     DW_FORM_implicit_const = 0x21,
    402     DW_FORM_loclistx = 0x22,
    403     DW_FORM_rnglistx = 0x23,
    404     DW_FORM_ref_sup8 = 0x24,
    405     DW_FORM_strx1 = 0x25,
    406     DW_FORM_strx2 = 0x26,
    407     DW_FORM_strx3 = 0x27,
    408     DW_FORM_strx4 = 0x28,
    409     DW_FORM_addrx1 = 0x29,
    410     DW_FORM_addrx2 = 0x2a,
    411     DW_FORM_addrx3 = 0x2b,
    412     DW_FORM_addrx4 = 0x2c,
    413 
    414     /* GNU Debug Fission extensions.  */
    415     DW_FORM_GNU_addr_index = 0x1f01,
    416     DW_FORM_GNU_str_index = 0x1f02,
    417 
    418     DW_FORM_GNU_ref_alt = 0x1f20, /* offset in alternate .debuginfo.  */
    419     DW_FORM_GNU_strp_alt = 0x1f21 /* offset in alternate .debug_str. */
    420   };
    421 
    422 
    423 /* DWARF location operation encodings.  */
    424 enum
    425   {
    426     DW_OP_addr = 0x03,		/* Constant address.  */
    427     DW_OP_deref = 0x06,
    428     DW_OP_const1u = 0x08,	/* Unsigned 1-byte constant.  */
    429     DW_OP_const1s = 0x09,	/* Signed 1-byte constant.  */
    430     DW_OP_const2u = 0x0a,	/* Unsigned 2-byte constant.  */
    431     DW_OP_const2s = 0x0b,	/* Signed 2-byte constant.  */
    432     DW_OP_const4u = 0x0c,	/* Unsigned 4-byte constant.  */
    433     DW_OP_const4s = 0x0d,	/* Signed 4-byte constant.  */
    434     DW_OP_const8u = 0x0e,	/* Unsigned 8-byte constant.  */
    435     DW_OP_const8s = 0x0f,	/* Signed 8-byte constant.  */
    436     DW_OP_constu = 0x10,	/* Unsigned LEB128 constant.  */
    437     DW_OP_consts = 0x11,	/* Signed LEB128 constant.  */
    438     DW_OP_dup = 0x12,
    439     DW_OP_drop = 0x13,
    440     DW_OP_over = 0x14,
    441     DW_OP_pick = 0x15,		/* 1-byte stack index.  */
    442     DW_OP_swap = 0x16,
    443     DW_OP_rot = 0x17,
    444     DW_OP_xderef = 0x18,
    445     DW_OP_abs = 0x19,
    446     DW_OP_and = 0x1a,
    447     DW_OP_div = 0x1b,
    448     DW_OP_minus = 0x1c,
    449     DW_OP_mod = 0x1d,
    450     DW_OP_mul = 0x1e,
    451     DW_OP_neg = 0x1f,
    452     DW_OP_not = 0x20,
    453     DW_OP_or = 0x21,
    454     DW_OP_plus = 0x22,
    455     DW_OP_plus_uconst = 0x23,	/* Unsigned LEB128 addend.  */
    456     DW_OP_shl = 0x24,
    457     DW_OP_shr = 0x25,
    458     DW_OP_shra = 0x26,
    459     DW_OP_xor = 0x27,
    460     DW_OP_bra = 0x28,		/* Signed 2-byte constant.  */
    461     DW_OP_eq = 0x29,
    462     DW_OP_ge = 0x2a,
    463     DW_OP_gt = 0x2b,
    464     DW_OP_le = 0x2c,
    465     DW_OP_lt = 0x2d,
    466     DW_OP_ne = 0x2e,
    467     DW_OP_skip = 0x2f,		/* Signed 2-byte constant.  */
    468     DW_OP_lit0 = 0x30,		/* Literal 0.  */
    469     DW_OP_lit1 = 0x31,		/* Literal 1.  */
    470     DW_OP_lit2 = 0x32,		/* Literal 2.  */
    471     DW_OP_lit3 = 0x33,		/* Literal 3.  */
    472     DW_OP_lit4 = 0x34,		/* Literal 4.  */
    473     DW_OP_lit5 = 0x35,		/* Literal 5.  */
    474     DW_OP_lit6 = 0x36,		/* Literal 6.  */
    475     DW_OP_lit7 = 0x37,		/* Literal 7.  */
    476     DW_OP_lit8 = 0x38,		/* Literal 8.  */
    477     DW_OP_lit9 = 0x39,		/* Literal 9.  */
    478     DW_OP_lit10 = 0x3a,		/* Literal 10.  */
    479     DW_OP_lit11 = 0x3b,		/* Literal 11.  */
    480     DW_OP_lit12 = 0x3c,		/* Literal 12.  */
    481     DW_OP_lit13 = 0x3d,		/* Literal 13.  */
    482     DW_OP_lit14 = 0x3e,		/* Literal 14.  */
    483     DW_OP_lit15 = 0x3f,		/* Literal 15.  */
    484     DW_OP_lit16 = 0x40,		/* Literal 16.  */
    485     DW_OP_lit17 = 0x41,		/* Literal 17.  */
    486     DW_OP_lit18 = 0x42,		/* Literal 18.  */
    487     DW_OP_lit19 = 0x43,		/* Literal 19.  */
    488     DW_OP_lit20 = 0x44,		/* Literal 20.  */
    489     DW_OP_lit21 = 0x45,		/* Literal 21.  */
    490     DW_OP_lit22 = 0x46,		/* Literal 22.  */
    491     DW_OP_lit23 = 0x47,		/* Literal 23.  */
    492     DW_OP_lit24 = 0x48,		/* Literal 24.  */
    493     DW_OP_lit25 = 0x49,		/* Literal 25.  */
    494     DW_OP_lit26 = 0x4a,		/* Literal 26.  */
    495     DW_OP_lit27 = 0x4b,		/* Literal 27.  */
    496     DW_OP_lit28 = 0x4c,		/* Literal 28.  */
    497     DW_OP_lit29 = 0x4d,		/* Literal 29.  */
    498     DW_OP_lit30 = 0x4e,		/* Literal 30.  */
    499     DW_OP_lit31 = 0x4f,		/* Literal 31.  */
    500     DW_OP_reg0 = 0x50,		/* Register 0.  */
    501     DW_OP_reg1 = 0x51,		/* Register 1.  */
    502     DW_OP_reg2 = 0x52,		/* Register 2.  */
    503     DW_OP_reg3 = 0x53,		/* Register 3.  */
    504     DW_OP_reg4 = 0x54,		/* Register 4.  */
    505     DW_OP_reg5 = 0x55,		/* Register 5.  */
    506     DW_OP_reg6 = 0x56,		/* Register 6.  */
    507     DW_OP_reg7 = 0x57,		/* Register 7.  */
    508     DW_OP_reg8 = 0x58,		/* Register 8.  */
    509     DW_OP_reg9 = 0x59,		/* Register 9.  */
    510     DW_OP_reg10 = 0x5a,		/* Register 10.  */
    511     DW_OP_reg11 = 0x5b,		/* Register 11.  */
    512     DW_OP_reg12 = 0x5c,		/* Register 12.  */
    513     DW_OP_reg13 = 0x5d,		/* Register 13.  */
    514     DW_OP_reg14 = 0x5e,		/* Register 14.  */
    515     DW_OP_reg15 = 0x5f,		/* Register 15.  */
    516     DW_OP_reg16 = 0x60,		/* Register 16.  */
    517     DW_OP_reg17 = 0x61,		/* Register 17.  */
    518     DW_OP_reg18 = 0x62,		/* Register 18.  */
    519     DW_OP_reg19 = 0x63,		/* Register 19.  */
    520     DW_OP_reg20 = 0x64,		/* Register 20.  */
    521     DW_OP_reg21 = 0x65,		/* Register 21.  */
    522     DW_OP_reg22 = 0x66,		/* Register 22.  */
    523     DW_OP_reg23 = 0x67,		/* Register 24.  */
    524     DW_OP_reg24 = 0x68,		/* Register 24.  */
    525     DW_OP_reg25 = 0x69,		/* Register 25.  */
    526     DW_OP_reg26 = 0x6a,		/* Register 26.  */
    527     DW_OP_reg27 = 0x6b,		/* Register 27.  */
    528     DW_OP_reg28 = 0x6c,		/* Register 28.  */
    529     DW_OP_reg29 = 0x6d,		/* Register 29.  */
    530     DW_OP_reg30 = 0x6e,		/* Register 30.  */
    531     DW_OP_reg31 = 0x6f,		/* Register 31.  */
    532     DW_OP_breg0 = 0x70,		/* Base register 0.  */
    533     DW_OP_breg1 = 0x71,		/* Base register 1.  */
    534     DW_OP_breg2 = 0x72,		/* Base register 2.  */
    535     DW_OP_breg3 = 0x73,		/* Base register 3.  */
    536     DW_OP_breg4 = 0x74,		/* Base register 4.  */
    537     DW_OP_breg5 = 0x75,		/* Base register 5.  */
    538     DW_OP_breg6 = 0x76,		/* Base register 6.  */
    539     DW_OP_breg7 = 0x77,		/* Base register 7.  */
    540     DW_OP_breg8 = 0x78,		/* Base register 8.  */
    541     DW_OP_breg9 = 0x79,		/* Base register 9.  */
    542     DW_OP_breg10 = 0x7a,	/* Base register 10.  */
    543     DW_OP_breg11 = 0x7b,	/* Base register 11.  */
    544     DW_OP_breg12 = 0x7c,	/* Base register 12.  */
    545     DW_OP_breg13 = 0x7d,	/* Base register 13.  */
    546     DW_OP_breg14 = 0x7e,	/* Base register 14.  */
    547     DW_OP_breg15 = 0x7f,	/* Base register 15.  */
    548     DW_OP_breg16 = 0x80,	/* Base register 16.  */
    549     DW_OP_breg17 = 0x81,	/* Base register 17.  */
    550     DW_OP_breg18 = 0x82,	/* Base register 18.  */
    551     DW_OP_breg19 = 0x83,	/* Base register 19.  */
    552     DW_OP_breg20 = 0x84,	/* Base register 20.  */
    553     DW_OP_breg21 = 0x85,	/* Base register 21.  */
    554     DW_OP_breg22 = 0x86,	/* Base register 22.  */
    555     DW_OP_breg23 = 0x87,	/* Base register 23.  */
    556     DW_OP_breg24 = 0x88,	/* Base register 24.  */
    557     DW_OP_breg25 = 0x89,	/* Base register 25.  */
    558     DW_OP_breg26 = 0x8a,	/* Base register 26.  */
    559     DW_OP_breg27 = 0x8b,	/* Base register 27.  */
    560     DW_OP_breg28 = 0x8c,	/* Base register 28.  */
    561     DW_OP_breg29 = 0x8d,	/* Base register 29.  */
    562     DW_OP_breg30 = 0x8e,	/* Base register 30.  */
    563     DW_OP_breg31 = 0x8f,	/* Base register 31.  */
    564     DW_OP_regx = 0x90,		/* Unsigned LEB128 register.  */
    565     DW_OP_fbreg = 0x91,		/* Signed LEB128 offset.  */
    566     DW_OP_bregx = 0x92,		/* ULEB128 register followed by SLEB128 off. */
    567     DW_OP_piece = 0x93,		/* ULEB128 size of piece addressed. */
    568     DW_OP_deref_size = 0x94,	/* 1-byte size of data retrieved.  */
    569     DW_OP_xderef_size = 0x95,	/* 1-byte size of data retrieved.  */
    570     DW_OP_nop = 0x96,
    571     DW_OP_push_object_address = 0x97,
    572     DW_OP_call2 = 0x98,
    573     DW_OP_call4 = 0x99,
    574     DW_OP_call_ref = 0x9a,
    575     DW_OP_form_tls_address = 0x9b,/* TLS offset to address in current thread */
    576     DW_OP_call_frame_cfa = 0x9c,/* CFA as determined by CFI.  */
    577     DW_OP_bit_piece = 0x9d,	/* ULEB128 size and ULEB128 offset in bits.  */
    578     DW_OP_implicit_value = 0x9e, /* DW_FORM_block follows opcode.  */
    579     DW_OP_stack_value = 0x9f,	 /* No operands, special like DW_OP_piece.  */
    580 
    581     DW_OP_implicit_pointer = 0xa0,
    582     DW_OP_addrx = 0xa1,
    583     DW_OP_constx = 0xa2,
    584     DW_OP_entry_value = 0xa3,
    585     DW_OP_const_type = 0xa4,
    586     DW_OP_regval_type = 0xa5,
    587     DW_OP_deref_type = 0xa6,
    588     DW_OP_xderef_type = 0xa7,
    589     DW_OP_convert = 0xa8,
    590     DW_OP_reinterpret = 0xa9,
    591 
    592     /* GNU extensions.  */
    593     DW_OP_GNU_push_tls_address = 0xe0,
    594     DW_OP_GNU_uninit = 0xf0,
    595     DW_OP_GNU_encoded_addr = 0xf1,
    596     DW_OP_GNU_implicit_pointer = 0xf2,
    597     DW_OP_GNU_entry_value = 0xf3,
    598     DW_OP_GNU_const_type = 0xf4,
    599     DW_OP_GNU_regval_type = 0xf5,
    600     DW_OP_GNU_deref_type = 0xf6,
    601     DW_OP_GNU_convert = 0xf7,
    602     DW_OP_GNU_reinterpret = 0xf9,
    603     DW_OP_GNU_parameter_ref = 0xfa,
    604 
    605     /* GNU Debug Fission extensions.  */
    606     DW_OP_GNU_addr_index = 0xfb,
    607     DW_OP_GNU_const_index = 0xfc,
    608 
    609     DW_OP_GNU_variable_value = 0xfd,
    610 
    611     DW_OP_lo_user = 0xe0,	/* Implementation-defined range start.  */
    612     DW_OP_hi_user = 0xff	/* Implementation-defined range end.  */
    613   };
    614 
    615 
    616 /* DWARF base type encodings.  */
    617 enum
    618   {
    619     DW_ATE_void = 0x0,
    620     DW_ATE_address = 0x1,
    621     DW_ATE_boolean = 0x2,
    622     DW_ATE_complex_float = 0x3,
    623     DW_ATE_float = 0x4,
    624     DW_ATE_signed = 0x5,
    625     DW_ATE_signed_char = 0x6,
    626     DW_ATE_unsigned = 0x7,
    627     DW_ATE_unsigned_char = 0x8,
    628     DW_ATE_imaginary_float = 0x9,
    629     DW_ATE_packed_decimal = 0xa,
    630     DW_ATE_numeric_string = 0xb,
    631     DW_ATE_edited = 0xc,
    632     DW_ATE_signed_fixed = 0xd,
    633     DW_ATE_unsigned_fixed = 0xe,
    634     DW_ATE_decimal_float = 0xf,
    635     DW_ATE_UTF = 0x10,
    636     DW_ATE_UCS = 0x11,
    637     DW_ATE_ASCII = 0x12,
    638 
    639     DW_ATE_lo_user = 0x80,
    640     DW_ATE_hi_user = 0xff
    641   };
    642 
    643 
    644 /* DWARF decimal sign encodings.  */
    645 enum
    646   {
    647     DW_DS_unsigned = 1,
    648     DW_DS_leading_overpunch = 2,
    649     DW_DS_trailing_overpunch = 3,
    650     DW_DS_leading_separate = 4,
    651     DW_DS_trailing_separate = 5,
    652   };
    653 
    654 
    655 /* DWARF endianity encodings.  */
    656 enum
    657   {
    658     DW_END_default = 0,
    659     DW_END_big = 1,
    660     DW_END_little = 2,
    661 
    662     DW_END_lo_user = 0x40,
    663     DW_END_hi_user = 0xff
    664   };
    665 
    666 
    667 /* DWARF accessibility encodings.  */
    668 enum
    669   {
    670     DW_ACCESS_public = 1,
    671     DW_ACCESS_protected = 2,
    672     DW_ACCESS_private = 3
    673   };
    674 
    675 
    676 /* DWARF visibility encodings.  */
    677 enum
    678   {
    679     DW_VIS_local = 1,
    680     DW_VIS_exported = 2,
    681     DW_VIS_qualified = 3
    682   };
    683 
    684 
    685 /* DWARF virtuality encodings.  */
    686 enum
    687   {
    688     DW_VIRTUALITY_none = 0,
    689     DW_VIRTUALITY_virtual = 1,
    690     DW_VIRTUALITY_pure_virtual = 2
    691   };
    692 
    693 
    694 /* DWARF language encodings.  */
    695 enum
    696   {
    697     DW_LANG_C89 = 0x0001,	     /* ISO C:1989 */
    698     DW_LANG_C = 0x0002,		     /* C */
    699     DW_LANG_Ada83 = 0x0003,	     /* ISO Ada:1983 */
    700     DW_LANG_C_plus_plus	= 0x0004,    /* ISO C++:1998 */
    701     DW_LANG_Cobol74 = 0x0005,	     /* ISO Cobol:1974 */
    702     DW_LANG_Cobol85 = 0x0006,	     /* ISO Cobol:1985 */
    703     DW_LANG_Fortran77 = 0x0007,	     /* ISO FORTRAN 77 */
    704     DW_LANG_Fortran90 = 0x0008,	     /* ISO Fortran 90 */
    705     DW_LANG_Pascal83 = 0x0009,	     /* ISO Pascal:1983 */
    706     DW_LANG_Modula2 = 0x000a,	     /* ISO Modula-2:1996 */
    707     DW_LANG_Java = 0x000b,	     /* Java */
    708     DW_LANG_C99 = 0x000c,	     /* ISO C:1999 */
    709     DW_LANG_Ada95 = 0x000d,	     /* ISO Ada:1995 */
    710     DW_LANG_Fortran95 = 0x000e,	     /* ISO Fortran 95 */
    711     DW_LANG_PLI = 0x000f,	     /* ISO PL/1:1976 */
    712     DW_LANG_ObjC = 0x0010,	     /* Objective-C */
    713     DW_LANG_ObjC_plus_plus = 0x0011, /* Objective-C++ */
    714     DW_LANG_UPC = 0x0012,	     /* Unified Parallel C */
    715     DW_LANG_D = 0x0013,		     /* D */
    716     DW_LANG_Python = 0x0014,	     /* Python */
    717     DW_LANG_OpenCL = 0x0015,	     /* OpenCL */
    718     DW_LANG_Go = 0x0016,	     /* Go */
    719     DW_LANG_Modula3 = 0x0017,	     /* Modula-3 */
    720     DW_LANG_Haskell = 0x0018,	     /* Haskell */
    721     DW_LANG_C_plus_plus_03 = 0x0019, /* ISO C++:2003 */
    722     DW_LANG_C_plus_plus_11 = 0x001a, /* ISO C++:2011 */
    723     DW_LANG_OCaml = 0x001b,	     /* OCaml */
    724     DW_LANG_Rust = 0x001c,	     /* Rust */
    725     DW_LANG_C11 = 0x001d,	     /* ISO C:2011 */
    726     DW_LANG_Swift = 0x001e,	     /* Swift */
    727     DW_LANG_Julia = 0x001f,	     /* Julia */
    728     DW_LANG_Dylan = 0x0020,	     /* Dylan */
    729     DW_LANG_C_plus_plus_14 = 0x0021, /* ISO C++:2014 */
    730     DW_LANG_Fortran03 = 0x0022,	     /* ISO/IEC 1539-1:2004 */
    731     DW_LANG_Fortran08 = 0x0023,	     /* ISO/IEC 1539-1:2010 */
    732     DW_LANG_RenderScript = 0x0024,   /* RenderScript Kernal Language */
    733     DW_LANG_BLISS = 0x0025,	     /* BLISS */
    734 
    735     DW_LANG_lo_user = 0x8000,
    736     DW_LANG_Mips_Assembler = 0x8001, /* Assembler */
    737     DW_LANG_hi_user = 0xffff
    738   };
    739 
    740 /* Old (typo) '1' != 'I'.  */
    741 #define DW_LANG_PL1 DW_LANG_PLI
    742 
    743 /* DWARF identifier case encodings.  */
    744 enum
    745   {
    746     DW_ID_case_sensitive = 0,
    747     DW_ID_up_case = 1,
    748     DW_ID_down_case = 2,
    749     DW_ID_case_insensitive = 3
    750   };
    751 
    752 
    753 /* DWARF calling conventions encodings.
    754    Used as values of DW_AT_calling_convention for subroutines
    755    (normal, program or nocall) or structures, unions and class types
    756    (normal, reference or value).  */
    757 enum
    758   {
    759     DW_CC_normal = 0x1,
    760     DW_CC_program = 0x2,
    761     DW_CC_nocall = 0x3,
    762     DW_CC_pass_by_reference = 0x4,
    763     DW_CC_pass_by_value = 0x5,
    764     DW_CC_lo_user = 0x40,
    765     DW_CC_hi_user = 0xff
    766   };
    767 
    768 
    769 /* DWARF inline encodings.  */
    770 enum
    771   {
    772     DW_INL_not_inlined = 0,
    773     DW_INL_inlined = 1,
    774     DW_INL_declared_not_inlined = 2,
    775     DW_INL_declared_inlined = 3
    776   };
    777 
    778 
    779 /* DWARF ordering encodings.  */
    780 enum
    781   {
    782     DW_ORD_row_major = 0,
    783     DW_ORD_col_major = 1
    784   };
    785 
    786 
    787 /* DWARF discriminant descriptor encodings.  */
    788 enum
    789   {
    790     DW_DSC_label = 0,
    791     DW_DSC_range = 1
    792   };
    793 
    794 /* DWARF defaulted member function encodings.  */
    795 enum
    796   {
    797     DW_DEFAULTED_no = 0,
    798     DW_DEFAULTED_in_class = 1,
    799     DW_DEFAULTED_out_of_class = 2
    800   };
    801 
    802 /* DWARF line content descriptions.  */
    803 enum
    804   {
    805     DW_LNCT_path = 0x1,
    806     DW_LNCT_directory_index = 0x2,
    807     DW_LNCT_timestamp = 0x3,
    808     DW_LNCT_size = 0x4,
    809     DW_LNCT_MD5 = 0x5,
    810     DW_LNCT_lo_user = 0x2000,
    811     DW_LNCT_hi_user = 0x3fff
    812   };
    813 
    814 /* DWARF standard opcode encodings.  */
    815 enum
    816   {
    817     DW_LNS_copy = 1,
    818     DW_LNS_advance_pc = 2,
    819     DW_LNS_advance_line = 3,
    820     DW_LNS_set_file = 4,
    821     DW_LNS_set_column = 5,
    822     DW_LNS_negate_stmt = 6,
    823     DW_LNS_set_basic_block = 7,
    824     DW_LNS_const_add_pc = 8,
    825     DW_LNS_fixed_advance_pc = 9,
    826     DW_LNS_set_prologue_end = 10,
    827     DW_LNS_set_epilogue_begin = 11,
    828     DW_LNS_set_isa = 12
    829   };
    830 
    831 
    832 /* DWARF extended opcode encodings.  */
    833 enum
    834   {
    835     DW_LNE_end_sequence = 1,
    836     DW_LNE_set_address = 2,
    837     DW_LNE_define_file = 3,
    838     DW_LNE_set_discriminator = 4,
    839 
    840     DW_LNE_lo_user = 128,
    841     DW_LNE_hi_user = 255
    842   };
    843 
    844 
    845 /* DWARF macinfo type encodings.  */
    846 enum
    847   {
    848     DW_MACINFO_define = 1,
    849     DW_MACINFO_undef = 2,
    850     DW_MACINFO_start_file = 3,
    851     DW_MACINFO_end_file = 4,
    852     DW_MACINFO_vendor_ext = 255
    853   };
    854 
    855 
    856 /* DWARF debug_macro type encodings.  */
    857 enum
    858   {
    859     DW_MACRO_define = 0x01,
    860     DW_MACRO_undef = 0x02,
    861     DW_MACRO_start_file = 0x03,
    862     DW_MACRO_end_file = 0x04,
    863     DW_MACRO_define_strp = 0x05,
    864     DW_MACRO_undef_strp = 0x06,
    865     DW_MACRO_import = 0x07,
    866     DW_MACRO_define_sup = 0x08,
    867     DW_MACRO_undef_sup = 0x09,
    868     DW_MACRO_import_sup = 0x0a,
    869     DW_MACRO_define_strx = 0x0b,
    870     DW_MACRO_undef_strx = 0x0c,
    871     DW_MACRO_lo_user = 0xe0,
    872     DW_MACRO_hi_user = 0xff
    873   };
    874 
    875 /* Old GNU extension names for DWARF5 debug_macro type encodings.
    876    There are no equivalents for the supplementary object file (sup)
    877    and indirect string references (strx).  */
    878 #define DW_MACRO_GNU_define		 DW_MACRO_define
    879 #define DW_MACRO_GNU_undef		 DW_MACRO_undef
    880 #define DW_MACRO_GNU_start_file		 DW_MACRO_start_file
    881 #define DW_MACRO_GNU_end_file		 DW_MACRO_end_file
    882 #define DW_MACRO_GNU_define_indirect	 DW_MACRO_define_strp
    883 #define DW_MACRO_GNU_undef_indirect	 DW_MACRO_undef_strp
    884 #define DW_MACRO_GNU_transparent_include DW_MACRO_import
    885 #define DW_MACRO_GNU_lo_user		 DW_MACRO_lo_user
    886 #define DW_MACRO_GNU_hi_user		 DW_MACRO_hi_user
    887 
    888 
    889 /* Range list entry encoding.  */
    890 enum
    891   {
    892     DW_RLE_end_of_list = 0x0,
    893     DW_RLE_base_addressx = 0x1,
    894     DW_RLE_startx_endx = 0x2,
    895     DW_RLE_startx_length = 0x3,
    896     DW_RLE_offset_pair = 0x4,
    897     DW_RLE_base_address = 0x5,
    898     DW_RLE_start_end = 0x6,
    899     DW_RLE_start_length = 0x7
    900   };
    901 
    902 
    903 /* Location list entry encoding.  */
    904 enum
    905   {
    906     DW_LLE_end_of_list = 0x0,
    907     DW_LLE_base_addressx = 0x1,
    908     DW_LLE_startx_endx = 0x2,
    909     DW_LLE_startx_length = 0x3,
    910     DW_LLE_offset_pair = 0x4,
    911     DW_LLE_default_location = 0x5,
    912     DW_LLE_base_address = 0x6,
    913     DW_LLE_start_end = 0x7,
    914     DW_LLE_start_length = 0x8
    915   };
    916 
    917 
    918 /* GNU DebugFission list entry encodings (.debug_loc.dwo).  */
    919 enum
    920   {
    921     DW_LLE_GNU_end_of_list_entry = 0x0,
    922     DW_LLE_GNU_base_address_selection_entry = 0x1,
    923     DW_LLE_GNU_start_end_entry = 0x2,
    924     DW_LLE_GNU_start_length_entry = 0x3
    925   };
    926 
    927 
    928 /* DWARF call frame instruction encodings.  */
    929 enum
    930   {
    931     DW_CFA_advance_loc = 0x40,
    932     DW_CFA_offset = 0x80,
    933     DW_CFA_restore = 0xc0,
    934     DW_CFA_extended = 0,
    935 
    936     DW_CFA_nop = 0x00,
    937     DW_CFA_set_loc = 0x01,
    938     DW_CFA_advance_loc1 = 0x02,
    939     DW_CFA_advance_loc2 = 0x03,
    940     DW_CFA_advance_loc4 = 0x04,
    941     DW_CFA_offset_extended = 0x05,
    942     DW_CFA_restore_extended = 0x06,
    943     DW_CFA_undefined = 0x07,
    944     DW_CFA_same_value = 0x08,
    945     DW_CFA_register = 0x09,
    946     DW_CFA_remember_state = 0x0a,
    947     DW_CFA_restore_state = 0x0b,
    948     DW_CFA_def_cfa = 0x0c,
    949     DW_CFA_def_cfa_register = 0x0d,
    950     DW_CFA_def_cfa_offset = 0x0e,
    951     DW_CFA_def_cfa_expression = 0x0f,
    952     DW_CFA_expression = 0x10,
    953     DW_CFA_offset_extended_sf = 0x11,
    954     DW_CFA_def_cfa_sf = 0x12,
    955     DW_CFA_def_cfa_offset_sf = 0x13,
    956     DW_CFA_val_offset = 0x14,
    957     DW_CFA_val_offset_sf = 0x15,
    958     DW_CFA_val_expression = 0x16,
    959 
    960     DW_CFA_low_user = 0x1c,
    961     DW_CFA_MIPS_advance_loc8 = 0x1d,
    962     DW_CFA_GNU_window_save = 0x2d,
    963     DW_CFA_GNU_args_size = 0x2e,
    964     DW_CFA_GNU_negative_offset_extended = 0x2f,
    965     DW_CFA_high_user = 0x3f
    966   };
    967 
    968 /* ID indicating CIE as opposed to FDE in .debug_frame.  */
    969 enum
    970   {
    971     DW_CIE_ID_32 = 0xffffffffU,		 /* In 32-bit format CIE header.  */
    972     DW_CIE_ID_64 = 0xffffffffffffffffULL /* In 64-bit format CIE header.  */
    973   };
    974 
    975 
    976 /* Information for GNU unwind information.  */
    977 enum
    978   {
    979     DW_EH_PE_absptr = 0x00,
    980     DW_EH_PE_omit = 0xff,
    981 
    982     /* FDE data encoding.  */
    983     DW_EH_PE_uleb128 = 0x01,
    984     DW_EH_PE_udata2 = 0x02,
    985     DW_EH_PE_udata4 = 0x03,
    986     DW_EH_PE_udata8 = 0x04,
    987     DW_EH_PE_sleb128 = 0x09,
    988     DW_EH_PE_sdata2 = 0x0a,
    989     DW_EH_PE_sdata4 = 0x0b,
    990     DW_EH_PE_sdata8 = 0x0c,
    991     DW_EH_PE_signed = 0x08,
    992 
    993     /* FDE flags.  */
    994     DW_EH_PE_pcrel = 0x10,
    995     DW_EH_PE_textrel = 0x20,
    996     DW_EH_PE_datarel = 0x30,
    997     DW_EH_PE_funcrel = 0x40,
    998     DW_EH_PE_aligned = 0x50,
    999 
   1000     DW_EH_PE_indirect = 0x80
   1001   };
   1002 
   1003 
   1004 /* DWARF XXX.  */
   1005 #define DW_ADDR_none	0
   1006 
   1007 /* Section 7.2.2 of the DWARF3 specification defines a range of escape
   1008    codes that can appear in the length field of certain DWARF structures.
   1009 
   1010    These defines enumerate the minium and maximum values of this range.
   1011    Currently only the maximum value is used (to indicate that 64-bit
   1012    values are going to be used in the dwarf data that accompanies the
   1013    structure).  The other values are reserved.
   1014 
   1015    Note: There is a typo in DWARF3 spec (published Dec 20, 2005).  In
   1016    sections 7.4, 7.5.1, 7.19, 7.20 the minimum escape code is referred to
   1017    as 0xffffff00 whereas in fact it should be 0xfffffff0.  */
   1018 #define DWARF3_LENGTH_MIN_ESCAPE_CODE 0xfffffff0u
   1019 #define DWARF3_LENGTH_MAX_ESCAPE_CODE 0xffffffffu
   1020 #define DWARF3_LENGTH_64_BIT          DWARF3_LENGTH_MAX_ESCAPE_CODE
   1021 
   1022 #endif	/* dwarf.h */
   1023