* config/tc-h8500.c (md_begin): Use a local variable when
[platform/upstream/binutils.git] / gas / ChangeLog
1 Thu Jul 22 12:09:41 1993  Ian Lance Taylor  (ian@cygnus.com)
2
3         * config/tc-h8500.c (md_begin): Use a local variable when
4         initializing md_relax_table to avoid warnings about modifying a
5         supposedly const data structure.
6
7 Thu Jul 22 10:58:51 1993  Brendan Kehoe  (brendan@lisa.cygnus.com)
8
9         * config/obj-aout.c: Only include aout/aout64.h if BFD_ASSEMBLER
10         is defined.
11
12 Wed Jul 21 17:32:02 1993  Fred Fish  (fnf@deneb.cygnus.com)
13
14         * configure.in (case ${host}):  Map *-*-sysv4* to gas_host=sysv.
15         * configure.in (case ${generic_target}):  Add i[34]86-*-sysv4*
16         case to set obj_format=elf.  Must go before i386-*-sysv* case that
17         sets obj_format=coffbsd.  Add *-*-sysv4* to *-*-elf and
18         *-*-solaris case, and move to before *-sysv* case that wants to
19         set obj_format to coff.
20         * config/tc-i386.c (i386_operand): Change all 'exp.X_op' to
21         'exp->X_op'.
22         * config/tc-i386.c (md_apply_fix):  Fix valp to be 'valueT *' for
23         BFD_ASSEMBLER case.
24
25 Wed Jul 21 12:47:51 1993  Ian Lance Taylor  (ian@tweedledumb.cygnus.com)
26
27         * config/obj-aout.c: Include aout/aout64.h.
28         (obj_aout_frob_symbol): Set BSF_DEBUGGING for a constructor
29         symbol, so that BFD doesn't tamper with the type.
30
31         * read.c (read_a_source_file): If NO_PSEUDO_DOT is defined, look
32         up opcodes as pseudo-ops even if they don't start with '.'.
33         * config/tc-m88k.h (NO_PSEUDO_DOT): Define.
34         * config/tc-m88k.c (md_assemble): Removed special pseudo-op
35         handling.
36         (md_apply_fix): Set fx_offset to the upper 16 bits of the reloc.
37         Output the low 16 bits for RELOC_HI16, not the high 16 bits.
38         * config/obj-coffbfd.c (do_relocs_for): If TC_M88K, set the
39         r_offset field of the reloc to the fixup offset.
40         (fixup_segments): If TC_M88K, don't warn about fixup overflows.
41         * doc/as.texinfo: Minor updates.
42
43 Tue Jul 20 19:28:56 1993  Ian Lance Taylor  (ian@tweedledumb.cygnus.com)
44
45         * Extensive changes to permit symbols to contain any expression
46         type and to delay the computation of the expression until the
47         value is actually needed.  This permits setting symbols to values
48         calculated based on object code size.  Expressions were changed to
49         no longer be in a section, to stop the overloading of segment and
50         expression type that previously occurred.
51
52         * as.c (big_section, pass1_section, diff_section, absent_section):
53         Removed.
54         (expr_section): Added (used for dummy symbols which hold
55         intermediate expression values).
56         (perform_an_assembly_pass): Create expr_section, do not create the
57         sections now removed.
58         * as.h (segT): Removed SEG_ABSENT, SEG_PASS1, SEG_BIG, and
59         SEG_DIFFERENCE.  Added SEG_EXPR.
60         (SEG_NORMAL): Corresponding changes.
61         * subsegs.c (seg_name, subsegs_begin): Changed accordingly.
62         * write.c (write_object_file): Ditto.
63         * config/obj-aout.c (seg_N_TYPE): Ditto.
64         * config/obj-bout.c (seg_N_TYPE): Ditto.
65         * config/obj-coff.c (seg_N_TYPE): Ditto.
66         * config/obj-coffbfd.c (seg_N_TYPE): Ditto.
67         * config/obj-vms.c (seg_N_TYPE): Ditto.
68
69         * expr.h (operatorT): Moved in from expr.c, added some values.
70         (expressionS): Added X_op field, removed X_seg field; renamed
71         X_subtract_symbol to X_op_symbol.
72         * expr.c: Extensive changes to assign expression types rather than
73         sections and to simplify the parsing.
74         * write.c (fix_new_internal): New static function.
75         (fix_new): Removed sub_symbol argument.
76         (fix_new_exp): New function, takes expression argument.
77         * write.h: Prototype changes for fix_new and fix_new_exp.
78         * cond.c (s_if): Changed accordingly.
79         * read.c (s_lsym, pseudo_set, emit_expr, parse_bitfield_cons,
80         parse_repeat_cons, get_segmented_expression,
81         get_known_segmented_expression, get_absolute_expression): Ditto.
82         * symbols.c (resolve_symbol_value, S_GET_VALUE, S_SET_VALUE):
83         Ditto.
84         * write.c (write_object_file): Ditto.
85         * config/obj-coff.c (obj_coff_def, obj_coff_val): Ditto.
86         * config/obj-coffbfd.c (obj_coff_def, obj_coff_val,
87         obj_coff_endef, yank_symbols): Ditto.
88         * config/obj-elf.c (obj_elf_stab_generic, obj_elf_size): Ditto.
89         * config/tc-a29k.c (md_assemble, parse_operand, machine_ip,
90         print_insn, md_operand): Ditto.
91         * config/tc-h8300.c (parse_exp, colonmod24, check_operand,
92         do_a_fix_imm, build_bytes): Ditto.
93         * config/tc-h8500.c (parse_exp, skip_colonthing, parse_reglist,
94         get_specific, check, insert, md_convert_frag): Ditto.
95         * config/tc-hppa.c (the_insn, fix_new_hppa, cons_fix_new_hppa,
96         md_assemble, pa_ip, getExpression, getAbsoluteExpression,
97         evaluateAbsolute, pa_build_unwind_subspace, pa_entry,
98         process_exit): Ditto.
99         * config/tc-hppa.h (STAB_FIXUP, is_DP_relative, is_PC_relative,
100         is_complex): Ditto.
101         * config/tc-i386.c (pe, md_assemble, i386_operand,
102         md_estimate_size_before_relax, md_create_long_jump): Ditto.
103         * config/tc-i860.c (md_assemble, getExpression, print_insn):
104         Ditto.
105         * config/tc-i960.c (parse_expr, subs, segs, md_convert_frag,
106         get_cdisp, mem_fmt, parse_ldconst, relax_cobr, s_sysproc,
107         i960_handle_align): Ditto.
108         * config/tc-m68k.c (struct m68k_exp, struct m68k_it, seg, op,
109         subs, add_fix, isvar, m68k_ip, md_assemble, md_convert_frag_1,
110         md_estimate_size_before_relax, md_create_long_jump, get_num):
111         Ditto.
112         * config/tc-m88k.c (md_assemble, get_imm16, get_pcr,
113         md_create_short_jump, md_create_long_jump): Ditto.
114         * config/tc-mips.c (md_assemble, append_insn, gp_reference,
115         macro_build, macro, my_getExpression): Ditto.  Also removed
116         get_optional_absolute_expression; just use get_absolute_expression
117         instead.
118         * config/tc-ns32k.c (get_addr_mode, evaluate_expr, convert_iif,
119         fix_new_ns32k, fix_new_ns32k_exp, cons_fix_new_ns32k): Ditto.
120         * config/tc-ns32k.h (fix_new_ns32k prototype): Ditto.
121         * config/tc-sh.c (parse_exp, check, insert, md_convert_frag):
122         Ditto.
123         * config/tc-sparc.c (md_assemble, sparc_ip, getExpression,
124         print_insn): Ditto.
125         * config/tc-tahoe.c (struct top, md_estimate_size_before_relax,
126         tip_op, md_assemble): Ditto.
127         * config/tc-vax.c (seg_of_operand, md_assemble,
128         md_estimate_size_before_relax, md_create_long_jump): Ditto.
129         * config/tc-z8k.c (parse_exp, check_operand, newfix): Ditto.
130
131 Tue Jul 20 12:17:16 1993  david d `zoo' zuhn  (zoo@rtl.cygnus.com)
132
133         * configure.in: i386-lynx is the same as i386-coff
134
135 Mon Jul 19 15:21:20 1993  Ken Raeburn  (raeburn@rtl.cygnus.com)
136
137         * config/obj-elf.c (obj_elf_previous): New function.
138         (previous_section, previous_subsection): New vars.
139         (obj_elf_section): Save current place in case DWARF code wants us
140         to pop back to it.  Handle unquoted section name as well as quoted
141         section name.  Don't crash on invalid strings.
142         (obj_pseudo_table): Handle new pseudos "previous", "2byte", and
143         "4byte".
144
145         * config/obj-elf.h: Don't include struc-symbol.h.
146         (obj_elf_frob_symbol): Declare arg as struct symbol *.
147
148         * tc-sparc.h (LOCAL_LABEL) [OBJ_ELF]: Local labels can start with
149         "L" or "_.L_".
150
151         * write.c (write_relocs): New function, split off from
152         write_contents.  Use memset instead of bzero.
153         (write_object_file): Apply write_relocs to each section before
154         applying write_contents.
155
156         * read.c (read_begin): Call obstack_begin with values closer to 1K
157         multiples.
158         (read_a_source_file, big_cons, float_cons): Use memcpy instead of
159         bcopy.
160
161 Mon Jul 19 14:30:00 1993  Ian Lance Taylor  (ian@tweedledumb.cygnus.com)
162
163         * config/tc-m68k.c (m68k_ip_op): Don't decrement strend when
164         calculating opP->isiz; this permits the expression size to be
165         determined as well, later on.
166
167         * expr.c (clean_up_expression): Don't cancel the subtraction of
168         undefined symbols.
169
170         * read.c (s_data), config/obj-coffbfd.c (obj_coff_data): If -R,
171         switch to text section rather than data section.
172
173 Mon Jul 19 12:35:39 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
174
175         * config/tc-m68k.c (m68k_ip, case AINDX): Add 6 to operand
176         expression (to take the pc-rel instruction itself into account)
177         before using the expression, instead of after.
178
179 Fri Jul 16 08:56:04 1993  Ian Lance Taylor  (ian@cygnus.com)
180
181         * read.c (float_cons): Simplified parsing logic.  If
182         REPEAT_CONS_EXPRESSIONS is defined, accept a repeat count.
183
184         * symbols.c (colon): Rather than a special case for TC_HPPA,
185         use new macro tc_frob_label.
186         * config/tc-hppa.h (tc_frob_label): Define.
187
188         * config/tc-mips.c: Many changes to support simple assembler
189         optimization.
190         (insn_label, prev_insn, prev_prev_insn, dummy_opcode,
191         prev_insn_valid, prev_insn_frag, prev_insn_where,
192         prev_insn_fixp, prev_insn_is_delay_slot): New static
193         variables.
194         (insn_uses_reg, mips_no_prev_insn, mips_emit_delays,
195         mips_align, s_stringer, s_mips_space): New static functions.
196         (mips_define_label): New global function.
197         (md_pseudo_table): For "ascii", "asciz", "asciiz", call
198         s_stringer.  Changed argument to float_cons from 0 or 1 to 'f'
199         or 'd'.  For "space" call s_mips_space.
200         (md_begin): Call mips_no_prev_insn.
201         (append_insn): Only insert necessary NOP instructions.
202         (macro): Call mips_emit_delays before setting mips_noreorder.
203         Increment and decrement mips_noreorder rather than using
204         save_reorder_condition.  Don't bother to use noreorder in
205         M_L_DOB and M_L_DAB, since append_insn will not insert a NOP.
206         (md_atof): Handle floating point numbers correctly for both
207         big and little endian targets.
208         (s_align, s_cons): Call mips_align rather than frag_align.
209         (s_change_seg, s_cons): Call mips_emit_delays.
210         (s_float_cons): Let float_cons do the work.
211         (s_mipsset): Call mips_emit_delays when setting noreorder.
212         * config/tc-mips.h (tc_frob_label): Define to be
213         mips_define_label.
214
215         * config/obj-ecoff.c (ecoff_build_symbols, ecoff_build_procs,
216         ecoff_frob_files): Consistently use S_GET_VALUE rather than
217         bfd_asymbol_value.  Warn if taking difference of symbols in
218         different segments.
219
220 Thu Jul 15 11:51:03 1993  Ian Lance Taylor  (ian@tweedledumb.cygnus.com)
221
222         * config/obj-ecoff.c (ecoff_frob_file): Discard all open scopes,
223         with a warning.
224
225         * config/obj-coffbfd.c (fixup_segment): If TC_M88K, don't adjust
226         by md_pcrel_from if we are relocating against a symbol (we still
227         need md_pcrel_from for a PC relative relocation within the same
228         file).
229         * config/tc-m88k.c (md_pcrel_from): Corrected return value.
230         (omagic): Removed unused variable.
231
232         * Preliminary support for m88k-coff.
233         * configure.in (m88k-*-coff*): New target.  Use coffbfd and
234         m88kcoff.
235         * config/m88kcoff.mt: New file.
236         * read.c (lex_type): New macro LEX_AT to set lex type of '@'.
237         (pseudo_set): Handle difference of symbols in different fragments
238         by saving the entire expression as the value of the symbol.
239         * symbols.c (resolve_symbol_value): Resolve difference
240         expressions.
241         * config/obj-coffbfd.c (obj_pseudo_table): If TC_M88K, accept
242         "sdef" as a synonym for "def".
243         * config/obj-coffbfd.h: If TC_M88K, include coff/m88k.h and set
244         TARGET_FORMAT.
245         (S_IS_LOCAL): Any symbol which includes \001 in the name is local.
246         * config/tc-m88k.c, config/tc-m88k.h: Numerous changes to bring
247         m88k port up to date, and to add COFF support.
248
249 Wed Jul 14 15:09:32 1993  Ian Lance Taylor  (ian@tweedledumb.cygnus.com)
250
251         * Removed sy_forward and replaced it with an undefined expression
252         as the value of a symbol.
253         * struc-symbol.h (struct symbol): Removed sy_forward field.  Added
254         sy_resolved and sy_resolving single bit fields.
255         * symbols.c (symbol_new): Don't initialize sy_forward field.
256         (resolve_symbol_value): New function to adjust symbol value by
257         fragment address, using recursion to resolve forward symbols.
258         * symbols.h: Added prototype for new function.
259         * read.c (pseudo_set): Set symbolP->sy_value to an undefined
260         expression rather than setting symbolP->sy_forward.
261         * write.c (write_object_file): Use resolve_symbol_value on
262         symbols, keeping the common case (the old behaviour) inline.
263         * config/obj-aout.c (obj_aout_frob_symbol): Removed sy_forward
264         handling (subsumed by write.c change).
265         * config/obj-coff.c, config/obj-coffbfd.c (obj_coff_val): Set
266         sy_value rather than sy_forward.
267         * config/obj-coffbfd.c (obj_coff_endef, yank_symbols): Check
268         expression segment rather than sy_forward.
269         (yank_symbols): Use resolve_symbol_value.
270         (crawl_symbols): Removed extra pass over symbols.
271         * config/obj-aout.c, config/obj-bout.c, config/obj-coff.c,
272         config/obj-vms.c (obj_crawl_symbol_chain): Removed extra pass over
273         symbols which handled sy_forward; use resolve_symbol_value
274         instead.
275         * config/obj-coff.h, config/obj-coffbfd.h (obj_frob_forward_symbol):
276         Define.
277         * config/obj-elf.c (obj_elf_stab_generic): Check expression
278         segment rather than sy_forward.
279         * config/obj-vms.c (VMS_Check_For_Main): Don't initialize
280         sy_forward; do initialize sy_resolved and sy_resolving.
281         * config/tc-hppa.h (STAB_FIXUP): Use sy_value, not sy_forward.
282
283         * Changes to keep a full expression as the value of a symbol, not
284         just a longword:
285         * struc-symbol.h: New field sy_value.
286         * as.h: Include expr.h before struc-symbol.h.
287         * expr.h: Use struct symbol rather than symbolS.
288         * symbols.c (S_GET_VALUE, S_SET_VALUE): Rewrote to retrieve value
289         of sy_value field; compile unconditionally, not just if
290         BFD_ASSEMBLER.
291         * symbols.h: Compile S_{SG}ET_VALUE prototypes unconditionally.
292         * write.c (write_object_file): Set BFD symbol value to gas symbol
293         value.
294         * config/obj-aout.h, config/obj-bout.h, config/obj-coff.h,
295         config/obj-coffbfd.h, config/obj-generic.h, config/obj-vms.h
296         (S_GET_VALUE, S_SET_VALUE): Removed macro definitions.
297         * config/obj-ieee.c (S_GET_VALUE, S_SET_VALUE): Removed.
298         * config/obj-coff.h, obj-coffbfd.h: Rewrote several macros to use
299         S_GET_VALUE rather than ost_entry.n_value.
300         * config/obj-aout.c (obj_symbol_to_chars), config/obj-bout.c
301         (obj_symbol_to_chars), config/obj-coff.c (obj_symbol_to_chars),
302         config/obj-coffbfd.c (symbol_to_chars): Get value to write out
303         using S_GET_VALUE--don't assume it is already set.
304         * config/obj-ieee.c (do_symbols): Set BFD symbol value to gas
305         symbol value.
306         * config/obj-vms.c (various): Don't assign directly to
307         S_GET_VALUE; use S_SET_VALUE instead.
308
309 Wed Jul 14 09:35:23 1993  Doug Evans  (dje@canuck.cygnus.com)
310
311         * configure.in: Recognize h8300h.
312
313 Tue Jul 13 12:09:44 1993  Steve Chamberlain  (sac@phydeaux.cygnus.com)
314
315         * config/tc-h8500.c (line_comment_chars): Add hash.
316         (parse_exp, skip_colonthing, build_bytes): Add support for
317         R_H8500_HIGH16 relocation type.
318
319 Mon Jul 12 11:15:34 1993  Ken Raeburn  (raeburn@deneb.cygnus.com)
320
321         * config/obj-elf.c (obj_elf_section): Allow `@' to introduce an
322         attribute name.  Handle `execinstr' attribute.
323
324 Mon Jul 12 07:22:28 1993  Ian Lance Taylor  (ian@cygnus.com)
325
326         * config/tc-mips.c (mips_ip): Don't warn on 'i' or 'j' mismatch if
327         there is another alternative for the instruction.
328
329 Fri Jul  9 17:31:34 1993  Roland H. Pesch  (pesch@fowanton.cygnus.com)
330
331         * doc/as.texinfo: updates for H8/300H
332
333 Thu Jul  8 14:41:43 1993  Mark Eichin  (eichin@cygnus.com)
334
335         * config/tc-i960.c (md_create_short_jump, md_create_long_jump,
336         md_number_to_chars, md_section_align): Adjusted to use valueT,
337         addressT, to match tc.h.
338
339 Thu Jul  8 14:15:05 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
340
341         * config/tc-sparc.c (s_common): Revamp to handle both syntaxes,
342         independent of format.
343
344 Thu Jul  8 07:25:25 1993  Doug Evans  (dje@canuck.cygnus.com)
345
346         * config/tc-h8300.h (TC_CONS_RELOC): Use R_RELLONG if h8/300h.
347
348 Wed Jul  7 18:11:07 1993  david d `zoo' zuhn  (zoo at rtl.cygnus.com)
349
350         * configure.in: define CROSS=-DCROSS_COMPILE if it is a cross
351         build; also recognize h8300-*-coff
352
353 Wed Jul  7 10:21:24 1993  Ian Lance Taylor  (ian@cygnus.com)
354
355         * symbols.c (fb_label_instance, fb_label_instance_inc): Don't dump
356         core just because somebody uses a label before it is defined.
357
358         * config/mips-opcode.h: Moved to opcode/mips.h.
359         * config/tc-mips.c: Include opcode/mips.h rather than
360         mips-opcode.h.
361         (append_insn): An extra NOP is only needed after instructions
362         which set HI or LO, not after instructions which read it.
363         (macro_build, mips_ip): Support new 'E', 'G' and 'B' arguments.
364         (macro): cfc1 and ctc1 now take "t,G" rather than "t,d".
365         * config/tc-mips.h (struct mips_opcode): Don't define.
366         * config/mips-big.mt, config/mips-lit.mt (TARG_CPU_DEPENDENTS):
367         Set to $(srcdir)/../include/opcode/mips.h.
368
369         Get the MIPS assembler up to speed with other gas changes:
370
371         * config/obj-ecoff.c (ecoff_set_vma, ecoff_frob_symbol):
372         Removed; don't change the symbol value.
373         (ecoff_build_symbols, ecoff_build_procs, ecoff_frob_file): Use
374         bfd_asymbol_value rather than S_GET_VALUE to include section
375         vma in symbol value.
376         (ecoff_frob_file): Ignore BSF_SECTION_SYM symbols, since ECOFF
377         doesn't output them.  Set the vma of sections.
378         * config/obj-ecoff.h: Don't define obj_frob_symbol.
379         * config/tc-mips.c (tc_gen_reloc): Adjustment by section vma is no
380         longer necessary.
381         (various): use valueT rather than long.
382
383 Wed Jul  7 08:33:30 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
384
385         * as.h (valueT): Typedef moved here.
386         * struc-symbol.h (valueT): ...from here.
387         * write.c (write_object_file): Locals from_addr, to_addr,
388         table_addr are now addressT.  Supply prototype for bfd_alloc for
389         now.
390         (fixup_segment): Local add_number is now valueT.  Correct some
391         range-checking bugs.
392         (relax_align): Type `int' should be sufficient for the exponent.
393         (fix_new): Argument offset is type offsetT.  Locals size and
394         newsize are type valueT.
395         * write.h (struct fix): Fields fx_offset and fx_addnumber are now
396         type valueT.
397         (fix_new): Fix prototype.
398         * symbols.c (symbol_new): Symbol value is type valueT.
399         (S_SET_VALUE, S_GET_VALUE): Likewise.
400         (S_IS_*): Specify int return type explicitly.
401         * symbols.h (symbol_new, S_GET_VALUE, S_SET_VALUE): Fixed
402         prototypes.
403         * read.c (s_comm): Values read are type valueT.
404         * expr.h (expressionS): Field X_add_number is an offsetT.
405         * tc.h (md_create_long_jump, md_create_short_jump,
406         md_section_align): Addresses are now type addressT.
407         (md_number_to_chars, md_apply_fix): Pass value as valueT.
408         * config/tc-i386.c (md_create_short_jump, md_create_long_jump,
409         md_number_to_chars, md_section_align): Adjusted.
410         * config/tc-sparc.c (sparc_ip): Initialize `len' variable to make
411         gcc shut up.
412         (md_create_short_jump, md_create_long_jump, md_number_to_chars,
413         md_section_align): Adjusted.
414
415         * config/tc-sparc.c (s_reserve): Permit use for other than a.out
416         format.
417         (s_common): Handle Solaris-2 version.
418
419         * config/ho-generic.h (free): Returns void if __STDC__.
420
421         * config/obj-elf.h (obj_elf_frob_symbol, elf_frob_file,
422         elf_file_symbol): Declare.
423
424         * expr.c (floating_constant, integer_constant): Now return void.
425
426 Thu Jul  1 12:13:43 1993  Ian Lance Taylor  (ian@cygnus.com)
427
428         * configure.in: Match on sparc*-fujitsu-none rather than
429         sparclite*-fujitsu-none.
430
431 Wed Jun 30 11:12:02 1993  Ian Lance Taylor  (ian@cygnus.com)
432
433         * read.c (cons): Conditionalize parsing of expression.  Move
434         putting value into object file into separate function.  Separate
435         out MRI and WANT_BITFIELDS cases into separate functions.
436         (emit_expr): New function to write data into object file.
437         Conditionalize on TC_CONS_FIX_NEW and TC_CONS_RELOC rather than on
438         processor types.
439         (parse_bitfield_cons): New function to parse bitfield expressions
440         as used by i960 assemblers.  Only compiled if
441         BITFIELD_CONS_EXPRESSIONS is defined.
442         (parse_mri_cons): New function to parse MRI style strings.  Only
443         compiled if MRI is defined.
444         (parse_repeat_cons): New function to parse repeat counts.  Only
445         compiled if REPEAT_CONS_EXPRESSIONS is defined.
446         * read.h (emit_expr): Added declaration of new function.
447         * config/tc-a29k.h (TC_CONS_RELOC): Define to be RELOC_32.
448         * config/tc-h8300.h (TC_CONS_RELOC): Define to be R_RELWORD.
449         * config/tc-hppa.c (parse_cons_expression_hppa): New function to
450         parse a HPPA expression, rather than special case in cons
451         function.
452         (cons_fix_new_hppa): New function to emit an HPPA fixup, rather
453         than special case in emit_expr function.
454         * config/tc-hppa.h (TC_PARSE_CONS_EXPRESSION, TC_CONS_FIX_NEW):
455         Define to use new functions from tc-hppa.c.
456         * config/tc-i960.h (BITFIELD_CONS_EXPRESSIONS): Define.
457         (WANT_BITFIELDS): Removed; now obsolete.
458         * config/tc-mips.h (REPEAT_CONS_EXPRESSIONS): Define.
459         * config/tc-ns32k.c (cons_fix_new_ns32k): New function to emit an
460         NS32K fixup, rather than special case in emit_expr function.
461         * config/tc-ns32k.h (TC_CONS_FIX_NEW): Define to be
462         cons_fix_new_ns32k.  Also use PARAMS rather than checking
463         __STDC__.
464         * config/tc-sparc.h (TC_CONS_RELOC): Define to RELOC_32.
465
466         * write.c (relax_and_size_seg, adjust_reloc_syms, write_contents):
467         Don't core dump if gas has no information about a section.
468
469 Wed Jun 30 06:21:27 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
470
471         * write.c (relax_and_size_seg): Always fully process a section.
472         Section size is last frag's (vm)address plus its size.  If no
473         relocations are present, force SEC_RELOC flag clear.
474         (dump_section_relocs): New debugging routine.
475         (adjust_reloc_syms): New routine, broken out from write_contents.
476         Don't adjust relocs that are already relative to section symbol.
477         Look for obj_fix_adjustable macro to know what else to skip,
478         instead of obj_write_symbol.  Look for section symbol stored in
479         section information.
480         (write_object_file): Map adjust_reloc_syms over all sections.
481         (write_contents): Clear SEC_RELOC flag if no relocations are
482         found.
483
484         * as.h (__PTR_TO_INT, __INT_TO_PTR): New versions for Saber, to
485         keep it quiet.
486
487         * write.c (remove_subsegs): Don't define for BFD_ASSEMBLER.
488
489 Fri Jun 25 14:42:53 1993  K. Richard Pixley  (rich@sendai.cygnus.com)
490
491         * Makefile.in (all, dvi, info, install-info, clean-info): do not
492           echo recursion lines.
493           (install-info, clean-info): collapse into the dvi and info rule.
494
495 Fri Jun 25 03:43:06 1993  Ken Raeburn  (raeburn@poseidon.cygnus.com)
496
497         * as.h (strstr): Disable declaration for now.
498         (fprint_value, sprint_value): Declare.
499
500         * subsegs.c (subseg_new_rest): Use memset to clear new frag.
501         (subseg_new) [BFD_ASSEMBLER]: Initialize all seginfo fields.
502
503         * expr.c (expr_part): Made sanity checks a.out-specific.
504         (expr): Disabled sanity checks.
505
506         * subsegs.h (segment_info_type) [BFD_ASSEMBLER]: Add field for
507         section symbol.
508         * subsegs.c (subseg_change): Initialize section symbol pointer
509         when setting up a new section.
510
511         * symbols.c (symbol_new) [BFD_ASSEMBLER]: Point BFD symbol's udata
512         field back at gas symbol structure.
513
514         * symbols.c (colon): Cast obstack_next_free value to char* before
515         doing arithmetic on it.
516         * subsegs.c (subseg_new_rest): Likewise.
517         * as.h (frag_now_fix): Likewise.
518
519         * config/obj-elf.c (elf_file_symbol): Use subseg_new instead of
520         calling bfd_make_section_old_way directly, and call subseg_set
521         instead of subseg_change.  Now returns void.
522         (obj_elf_write_symbol): Only check local symbols for now.
523         (elf_stab_symbol): Now static and void, and disabled until it
524         works completely.
525         (obj_elf_size): For expression values, fail silently for now.
526         (obj_symbol_new_hook): Do nothing.
527
528         * config/tc-sparc.c (tc_gen_reloc): Handle BFD_RELOC_SPARC_WDISP22
529         relocation.
530         (s_local) [OBJ_ELF]: New function.
531         (md_pseudo_table) [OBJ_ELF]: Call it for "local".
532         (s_common): Rearrange to handle Solaris .common pseudo, which may
533         sometimes use bss space instead of common.
534         * config/obj-elf.h (TARGET_SYMBOL_FIELDS): Add new `local' field.
535
536 Thu Jun 24 16:33:53 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
537
538         * configure.in: set host config to hpux for hppa*-hp-hpux
539
540 Thu Jun 24 13:35:06 1993  Ken Raeburn  (raeburn@poseidon.cygnus.com)
541
542         * app.c (app_pop, app_push): Fix bug reported by Chris Arthur.
543
544 Tue Jun 22 01:04:23 1993  Ken Raeburn  (raeburn@poseidon.cygnus.com)
545
546         * subsegs.c (subseg_new): Don't special-case a.out -R flag here.
547         * config/obj-aout.c (s_sect): Do it here.
548
549         * as.h (BAD_CASE): Don't make some lame compilers think we want
550         substitution inside strings.
551
552         * as.c (print_version_id): New function, split off from main.
553         (main): Call it.
554         * config/tc-sparc.c (md_parse_option) [OBJ_ELF]: Print version id
555         for -V.  Ignore -Q and -s options for now.
556
557 Mon Jun 21 17:37:59 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
558
559         * Makefile.in: make installation & builds work again for crosses
560
561 Sun Jun 20 18:18:26 1993  Ken Raeburn  (raeburn@poseidon.cygnus.com)
562
563         * listing.c (list_symbol_table): Rewrite to print wide (>32 bits)
564         symbol values correctly.
565
566         * write.c (write_object_file): Deleted unused variables.
567         (fixup_segment): Use sprint_value.
568
569         * messages.c (sprint_value, fprint_value): New routines.
570
571         * config/obj-elf.c (elf_stab_symbol): Now returns void.
572         (obj_elf_stab_generic): Fix typo in logic.
573
574         * Makefile.in (INCLUDES): Look in ../bfd for bfd.h.
575
576         * as.h (addressT, offsetT): New types, using BFD types if
577         available.
578         (relax_addressT, struct frag): Use them.
579         * struc-symbol.h (valueT, struct broken_word): Likewise.
580
581         * as.h (subseg_new) [BFD_ASSEMBLER]: Name argument is const.
582         * subsegs.c (subseg_new) [BFD_ASSEMBLER]: Name argument is const.
583
584 Thu Jun 17 16:53:56 1993  david d `zoo' zuhn (zoo@cygnus.com)
585         
586         * Makefile.in: canonicalize install.sh; for use within
587         this directory (and subdirs)
588
589 Sun Jun 20 02:34:04 1993  Ashley Saulsbury (ans@sics.se)
590
591         * m88k-opcode.h : fixed tiny tiny mistake - xcr was incorrectly
592         specified, should have both S1 and S2 fields identical
593         If only finding the problem was as fast as fixing the bug !!!!
594
595 Tue Jun 15 16:01:57 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
596
597         * write.c (write_contents): Do write out non-loadable sections.
598         Debug sections can fall in this category.
599
600         * read.c (s_app_file): Call elf_file_symbol for ELF files.
601         * config/obj-elf.c (elf_file_symbol): New function.
602
603         * config/obj-elf.c (elf_stab_symbol_string): Renamed from pa_...,
604         added argument to specify section base name.
605         (obj_elf_stab_generic): Renamed from ..._stab.  New argument
606         specifies section base name.
607         (obj_elf_stab): New function, calls obj_elf_stab_generic with
608         ".stab" as section base name.
609         (obj_elf_xstab): New function, calls obj_elf_stab_generic.
610         (obj_elf_type): Handle "object".  Use bitwise-or to merge in
611         symbol flags rather than simply replacing, so global/local flags
612         are preserved.
613         (obj_elf_ident): Rewrite.
614
615 Tue Jun 15 17:03:25 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
616
617         * Makefile.in: remove parentdir support; use INSTALL_XFORM
618
619 Wed Jun  9 11:26:07 1993  Ian Lance Taylor  (ian@cygnus.com)
620
621         * config/tc-i386.c (md_pseudo_table): .align uses a power of two
622         for any a.out target, not just Linux and 386BSD.
623         * config/tc-i386.h (DOT_LABEL_PREFIX): Do not define for any a.out
624         target.
625
626 Mon Jun  7 13:33:19 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
627
628         * config/tc-m88k.c: Don't include flonum.h, md.h, m88k.h.  They
629         don't exist or duplicate other inclusions.
630
631         * config/tc-vax.h (NO_RELOC): Define.
632
633 Sat Jun  5 19:32:52 1993  Torbjorn Granlund  (tege@nada.kth.se)
634
635         * gas/config/m88k-opcode.h (m88k_opcodes): Add 88110 instructions.
636         * gas/config/tc-m88k.c (get_reg): New arg reg_prefix.  Compare first
637         char to reg_prefix instead of to 'r'.
638         (calcop): Change calls to get_reg.
639         (calcop): Handle new case 'x' to set reg_prefix.
640         (calcop): Set reg_prefix to 'r' after each call to get_reg.
641         (cmpslot): Add 88110 conditions.
642
643         * gas/config/m88k-opcode.h: Swap cases for "rot" for consistency.
644
645         * gas/config/tc-m88k.c (get_bf): Always restore input_line_pointer
646         before returning.
647
648         * gas/config/m88k-opcode.h (m88k_opcodes): Make equal mnemonics
649         adjacent; mov.s and mov.d swapped.
650         (m88k_opcodes): Fix typo `r2' -> `2'.
651
652 Fri Jun  4 15:59:31 1993  Steve Chamberlain  (sac@phydeaux.cygnus.com)
653
654         * config/h8300.c: Support for H8/300-H opcodes.
655
656         * config/obj-coffbfd.c (w_strings): String table length is 4
657         bytes, no matter what the host int size is.
658
659         * configure.in (alpha-*-osf*): New.
660
661 Fri Jun  4 07:51:18 1993  Ian Lance Taylor  (ian@cygnus.com)
662
663         * configure.in (mips-*-ecoffl*): New target; use ecoff and
664         mips-lit.
665         (mips-*-ecoff*): Added trailing '*'.
666
667         * config/obj-ecoff.c (ecoff_build_procs): Force the adr of the
668         first FDR in a file to be zero.
669
670 Thu Jun  3 14:09:59 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
671
672         * Makefile.in (VERSION): Jump to 2.1.4.
673
674         * config/ho-hppabsd.h: New file, from Peter Hoogenboom.
675
676         * config/tc-mips.c (md_assemble): Call bfd_set_gp_size only for
677         ECOFF format.
678
679 Tue Jun  1 15:21:57 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
680
681         * config/tc-m68k.c (md_assemble): The 68040 cpu doesn't want a
682         separate '851 mmu.
683
684         * config/obj-elf.c, config/obj-elf.h: Update for new type, macro,
685         and routine names.  Assuming 32 bits for now.
686
687         * config/obj-elf.c (elf_frob_file): Look for macro
688         elf_tc_final_processing_hook, instead of assuming a function
689         always exists.
690         * config/tc-hppa.c (elf_hppa_final_processing_hook): Renamed from
691         tc_final_processing_hook.
692         * config/tc-hppa.h (elf_tc_final_processing_hook): Use it.
693
694         * config/tc-hppa.h (elf_tc_symbol, elf_tc_make_sections): Macros
695         moved here from obj-elf.h.
696         * config/obj-elf.h: Don't include CPU-specific header files.
697
698 Sun May 30 16:49:37 1993  Peter Hoogenboom  (hoogen@fast.cs.utah.edu)
699
700         * configure.in: configurations should match on 'hppa*' not 'hppa'.
701
702         * read.c: Add support for HPPA assembly language syntax (denoted
703         with '#ifdef TC_HPPA').
704
705         * symbols.c: Add support for HPPA assembly language syntax (denoted
706         with '#ifdef TC_HPPA').
707
708         * write.c (write_contents):  Add support for HPPA-style
709         relocations.
710
711         * config/obj-elf.c: Stab symbols weren't written properly.
712         (obj_elf_version):
713         (obj_elf_desc):
714         (obj_elf_write_symbol):
715         (obj_elf_write_symbol_p):
716         (obj_elf_frob_symbol):
717         (elf_stab_symbol):
718         (elf_frob_file):
719
720         * config/tc-hppa.c: Support for HPPA symbol extension sections.
721         Remove some unused code.  Support for HPPA assembly language
722         syntax.
723
724         * app.c:
725
726         * symbols.c:
727
728         * config/obj-elf.h:
729         (obj_write_symbol):
730         (obj_frob_file):
731         (elf_tc_symbol):
732         (elf_tc_make_sections):
733
734         * config/tc-hppa.h:
735
736 Sun May 30 21:44:45 1993  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
737
738         * config/obj-ecoff.c (obj_read_begin_hook, add_file): Assume
739         hash_new will have succeeded if it returns.
740         * config/tc-a29k.c (md_begin): Likewise.
741
742         * config/tc-i386.c (tc_aout_fix_to_chars): Now nbytes_r_length is
743         const.
744         (mode_from_disp_size, opcode_suffic_to_type): Now inline under
745         gcc.
746         (fits_in_{signed,unsigned}_{byte,word}): Likewise.
747
748         * expr.c: Delete register declarations; gcc ignores them anyways.
749
750 Fri May 28 19:03:32 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
751
752         * hash.c (hash_new): Use xmalloc, since many callers don't check
753         for failure.
754
755 Thu May 27 13:02:15 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
756
757         * frags.c (zero_address_frag, bss_address_frag): These are
758         external.
759
760         * tc.h (md_reloc_size): This is const.
761         * config/tc-{a29k,h8300,h8500,i386,i860,i960,m68k,ns32k,z8k}.c
762         (md_reloc_size): Now const.
763
764         * config/aout_gnu.h (enum machine_type, enum reloc_type): Delete
765         trailing commas.
766         * as.h (enum _segT): Ditto.
767
768         * struc-symbol.h (N_TYPE_seg): This should be const.
769
770 Thu May 27 11:43:59 1993  Michael Meissner  (meissner@osf.org)
771
772         * config/obj-ecoff.c (add_file): Cast file_name to char * in
773         listing_source_file call.
774
775         * config/obj-elf.c (elf_stab_symbol_string): Cast first argument
776         of subseg_new call to eliminate const attribute.
777         (obj_elf_stab): Ditto.
778         (obj_symbol_new_hook): Cast first argument of bzero call to char *.
779
780         * read.c (s_align_bytes): Properly record alignment.
781
782         * expr.c (__): Undefine __ macro before use, since OSF/1 uses it
783         for the prototype/no prototype macro.
784
785         * as.c (got_sig): Don't do return ((SIGTY) 0), SIGTY might well be
786         void.
787
788         * as.h (relax_stateT enum): Delete trailing comma.
789
790 Thu May 27 11:07:50 1993  Ian Lance Taylor  (ian@cygnus.com)
791
792         * app.c (do_scrub_begin): Let line_comment_chars override
793         comment_chars.
794         (do_scrub_next_char): If a line comment character is not at the
795         start of a line, treat it as a comment character if it is one.
796         For a CPP line comment use pseudo-op .appline rather than .line.
797         * input-scrub.c (logical_input_line): Make int rather than
798         unsigned.
799         (input_scrub_push, input_scrub_begin): Initialize
800         logical_input_line to -1 rather than 0.
801         (bump_line_counters): Increment logical_input_line.
802         (new_logical_line): If line_number is -2, decrement
803         logical_input_line.
804         (as_where): Use logical_input_line even if it is 0.
805         * read.h (s_app_file prototype): Now takes an int argument.
806         * read.c (potable): Make .appfile call s_app_file with 1.  New
807         .appline pseudo-op calls s_app_line.
808         (s_app_file): If .appfile, call new_logical_line with -2 to
809         account for newline inserted by do_scrub_next_char.  If listing,
810         call listing_source_file.
811         (s_app_line): New function to handle fake pseudo-op .appline.
812         * config/obj-coff.c (obj_pseudo_table): Make .appline call
813         obj_coff_ln.
814         (obj_coff_ln): Added argument to indicate whether .appline.
815         * config/obj-coffbfd.c (obj_pseudo_table): Make .appline call
816         obj_coff_ln.
817         (obj_coff_ln): Added argument to indicate whether .appline.
818         * config/tc-mips.c (s_file): Pass argument to s_app_file.
819
820 Tue May 25 11:59:07 1993  Ian Lance Taylor  (ian@cygnus.com)
821
822         * config/obj-bout.h (S_GET_VALUE): Removed unnecessary cast.
823
824 Thu May 20 19:14:24 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
825
826         * config/tc-m68k.c (md_apply_fix_2): Straighten out check for
827         invalid values.
828
829 Wed May 19 07:33:17 1993  Steve Chamberlain  (sac@phydeaux.cygnus.com)
830
831         * config/tc-h5000.c (build_bytes): Understand @rd mode and build
832         relocations correctly.
833
834 Mon May 17 15:06:26 1993  Ken Raeburn  (raeburn@deneb.cygnus.com)
835
836         * Makefile.in (FLAGS_TO_PASS): Leave out TEXI2DVI for now, because
837         it's wrong.
838
839         * config/tc-m68k.c (md_apply_fix_2): Apply range checks and warn
840         if value is out of range.
841
842         Patch from Minh Tran-Le:
843         * config/tc-i386.c (i386_operand): For in/out port register used
844         as base reg, include InOutPortReg in operand type.
845         (MATCH): Accept overlap value of InOutPortReg.
846
847 Mon May 17 09:29:34 1993  Ian Lance Taylor  (ian@cygnus.com)
848
849         * config/obj-ecoff.c (add_file, obj_ecoff_loc, obj_ecoff_stab):
850         Add calls to listing routines to produce combined source/assembler
851         listings.
852         (obj_ecoff_stab): Create a file pointer if none used yet.
853         (ecoff_frob_file): Set symcount to correct value.
854
855 Fri May 14 06:53:33 1993  Ken Raeburn  (raeburn@deneb.cygnus.com)
856
857         * Makefile.in (VERSION): Bump to version 2.1, in preparation for
858         release.
859
860         * config/obj-aout.h (H_GET_HEADER_SIZE, H_SET_SYMBOL_TABLE_SIZE):
861         Define in terms of constants, not C structure sizes.
862
863         * config/tc-rs6000.c, config/tc-rs6000.h: Delete empty files.
864
865 Thu May 13 17:01:55 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
866
867         * config/obj-aout.c (obj_header_append): Don't define if it's
868         defined as a macro.
869         * config/obj-hp300.h (obj_header_append): Define it as a macro.
870         * config/obj-hp300.c (hp300_header_append): New function.
871
872         * Makefile.in (distclean): Don't bother cleaning up doc files;
873         they aren't going to be in this directory.
874
875 Thu May 13 07:51:35 1993  Ian Lance Taylor  (ian@cygnus.com)
876
877         * config/obj-ecoff.c (ecoff_build_symbols): Handle absolute
878         symbols.
879
880         * tc.h (TC_COFF_SIZEMACHDEP): Don't define here.
881         * config/tc-sh.h (TC_COFF_SIZEMACHDEP): Define here instead.
882
883 Mon May 10 06:01:12 1993  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
884
885         * config/obj-vms.c (VMS_Symbol_type_list): Don't bother with
886         initialization.
887
888         * configure.in (targets): Treat m68*-*-sysv* like m68k-*-coff.
889
890 Wed May  5 14:00:49 1993  Ian Lance Taylor  (ian@cygnus.com)
891
892         * config/tc-mips.c (macro): Correct floating point double word
893         loads and stores for big endian target.
894
895 Wed May  5 08:39:21 1993  Ken Raeburn  (raeburn@deneb.cygnus.com)
896
897         * config/tc-i386.c: Replace SEG_* with *_section, fix up subseg_*
898         calls.  Deleted some unused code.
899         * config/obj-coff.c: Likewise.
900
901         ELF support, mostly contributed by Utah:
902         * config/obj-elf.c (obj_elf_section, obj_elf_stab, obj_elf_line,
903         obj_elf_type): Rewrite.
904         (obj_elf_frob_symbol, elf_stab_symbol_string, elf_stab_symbol,
905         obj_elf_desc, obj_elf_version, obj_symbol_new_hook, obj_elf_size):
906         New functions.
907         (obj_elf_ident): Dummy.
908         * config/obj-elf.h (FALSE, TRUE, S_*, tc_frob_symbol,
909         TARGET_SYMBOL_FIELDS): New macros.
910         (gdb_section): New variable decl.
911
912         * config/tc-i386.c (md_atof): Return zero, not empty string, on
913         success.
914
915         BFD_ASSEMBLER conditional changes:
916         * config/obj-coff.c (lineno_rootP, seg_N_TYPE, *_section_header):
917         Don't define these.
918         (SA_SET_SYM_ENDNDX, SA_SET_SYM_TAGNDX): New functions.
919         (fetch_coff_debug_section): Ditto.
920         (obj_coff_endef): Call fetch_coff_debug_section.
921         (struct line_no): New type.
922         (c_symbol_merge): New way for copying aux fields.
923         (c_dot_file_symbol): Put symbol in absolute section, and set flag
924         BSF_DEBUGGING.
925         (function_lineoff): New symbol.
926         (function_lineoff, text_lineno_number, our_lineno_number,
927         lineno_lastP): Don't define.
928         (c_line_new): Don't define.
929         (obj_emit_lineno, obj_coff_endef): Use abort calls as, uh,
930         placeholders, until
931         line-number recording gets implemented.
932         (obj_new_symbol_hook): New code for handling aux fields.
933         (add_lineno, add_linesym): New functions.
934         (obj_coff_ln): Call add_lineno, not c_line_new.
935         (obj_coff_endef): New code for handling symbol names.  New lineno
936         code.  Look for section name "*DEBUG*" for debugging section.
937         (align, coff_check_file_symbols, obj_coff_section,
938         coff_frob_file): New functions.
939         * config/obj-coff.h: Reordered some includes.
940         (BYTE_ORDERING, FILE_HEADER_MAGIC, seg_N_TYPE, N_TYPE_seg,
941         DEFAULT_MAGIC_NUMBER_FOR_OBJECT_FILE, AOUTHDR, AOUTHDRSIZE): Don't
942         define these.
943         (TARGET_SYMBOL_FIELDS, I960_SYM_FIELDS): New macros.
944         (SYM_AUXENT): New macro (for non-BFD_ASSEMBLER too) for accessing
945         aux entries.  Most SA_* macros now use it unconditionally.
946         (S_*): Use `bsym' field, and access BFD private data.
947         (SF_*): Use `sy_flags' symbol field for most of these.
948         (H_*, object_headers, lineno, lineno_*P, OBJ_EMIT_LINENO): Don't
949         define.
950         (*_section_header): Don't define.
951         * config/tc-i386.c (md_convert_frag, md_apply_fix): Changed
952         interface.
953         (tc_gen_reloc) [I386COFF]: New function.
954         (tc_aout_fix_to_chars, tc_coff_fix2rtype): Don't define.
955         * config/tc-i386.h (TARGET_ARCH, TARGET_BYTES_BIG_ENDIAN): New
956         macros.
957
958         * config/obj-coff.c (stack_init): Don't do assignments inside
959         conditions.
960         (obj_coff_def): Simplified handling of symbol name a bit.
961         (tag_insert): Name argument is now pointer to CONST.
962         (obj_crawl_symbol_chain): Commented out.
963
964         * config/obj-coff.h: Use PARAMS macro in prototypes.
965
966         * write.c (relax_and_size_seg) [BFD_ASSEMBLER]: Don't indirect
967         through frchainP pointer if it is null.
968
969         * configure.in: Warn if BFD mode is explicitly turned off but is
970         required by specified target.
971         (mips ecoff targets): Don't need to set bfd_gas here; it gets
972         taken care of later.
973
974         * config/obj-coffbfd.c (crawl_symbols): Don't clear sy_forward
975         field.
976         (yank_symbols): Merge symbols only if sy_forward is null.
977
978         * config/tc-m68k.h (AOUT_MACHTYPE): Don't define if already
979         defined.
980
981         * tc.h (md_convert_frag) [BFD_ASSEMBLER]: Section arg is not
982         pointer.
983         * config/tc-m68k.c (md_convert_frag) [BFD_ASSEMBLER]: Ditto.
984
985         * config/tc-sparc.h (LOCAL_LABEL) [OBJ_ELF]: Anything starting
986         with "." is a local label.
987
988         * config/te-hppa.h, config/tc-hppa.h, config/tc-hppa.c: New config
989         files.
990
991         * config/te-linux.h, config/te-386bsd.h: New config files.
992         * configure.in (i386-*-linux, i386-*-bsd): Use them.
993         * config/tc-i386.h (TARGET_FORMAT): Select format based on target
994         environment.
995         (DOT_LABEL_PREFIX): Don't define for 386bsd or Linux.
996
997 Wed May  5 13:14:01 1993  Ian Lance Taylor  (ian@cygnus.com)
998
999         * config/obj-ecoff.c (init_file): Set fMerge to 0 since dbx seems
1000         to want it that way.
1001         (ecoff_build_symbols): Turn local st_Proc symbols into
1002         st_StaticProc symbols.  Set index field of external st_Proc and
1003         st_staticProc symbols correctly.
1004         * config/tc-mips.h (NO_LISTING): Don't define.  People might want
1005         listings.
1006
1007 Tue May  4 21:22:54 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1008
1009         * config/obj-hp300.h, config/obj-hp300.c, config/te-hp300.h: New
1010         files.
1011         * configure.in (m68k-*-hpux): Use them.
1012
1013         * config/obj-aout.c (obj_pre_write_hook): Use AOUT_VERSION if
1014         defined, otherwise zero.
1015
1016         * config/aout_gnu.h (OMAGIC): Don't define if already defined.
1017
1018 Mon May  3 15:59:32 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1019
1020         * config/tc-sparc.c (sparc_ip): Allow any abs expression as an
1021         address space number.
1022
1023 Wed Apr 28 19:11:22 1993  Ken Raeburn  (raeburn@deneb.cygnus.com)
1024
1025         * config/obj-aout.h (TARGET_DEFAULT): Don't default this at all.
1026
1027         * config/tc-a29k.c: Include ctype.h.
1028         (define_some_regs): Added special-purpose registers for 29050.
1029
1030         * config/tc-i386.c (comment_chars) [TE_I386AIX]: Include "/".
1031
1032         * config/obj-coffbfd.c (fill_section): Don't set STYP_REG here.
1033         (change_to_section): Set it here instead.
1034
1035 Wed Apr 28 13:40:29 1993  Ian Lance Taylor  (ian@rtl.cygnus.com)
1036
1037         * config/obj-ecoff.c (obj_symbol_new_hook): Make up a .file if one
1038         hasn't been seen yet.
1039         (add_ecoff_symbol): Don't refer to cur_file_ptr if it is NULL.
1040
1041 Mon Apr 26 18:29:05 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1042
1043         * config/tc-sh.ch, config/tc-sh.h: New files supporting Hitachi
1044         SH.
1045
1046 Mon Apr 26 12:28:27 1993  Ian Lance Taylor  (ian@cygnus.com)
1047
1048         * expr.c (operand): Fix unary plus operator (previously was the
1049         same as '~' operator!).
1050
1051 Wed Apr 21 00:20:11 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1052
1053         * write.c (cvt_frag_to_fill): Define even if BFD is defined.
1054         (write_object_file): Do define if BFD_ASSEMBLER.  Invoke
1055         obj_check_file_symbols if defined.  Call verify_symbol_chain_2
1056         instead of open-coding it.  Fix some bugs in patching up symbol
1057         chain.
1058         (relax_segment): Make some code we "ought to be able to" use for
1059         all targets no longer conditionalized on ns32k target; instead, do
1060         it always, and if the appropriate conditions fail, abort.
1061
1062         * symbols.c (DEBUG): Enabled.
1063         (symbol_new): Make sure bfd_make_empty_symbol works.
1064         (verify_symbol_chain_2): New funcion; takes one symbol as
1065         argument, anywhere in the chain.
1066         (dollar_label*): Use default initializers.
1067
1068         * as.c (perform_an_assembly_pass): Call md_begin here...
1069         (main): ...and not here.
1070
1071         * config/tc-m68k.h (TARGET_FORMAT): Use a.out-sunos-big for a.out.
1072         (tc_frob_symbol): New macro: Get rid of symbols in reg_section.
1073
1074         * config/tc-m68k.c (omagic): Don't define for BFD_ASSEMBLER.
1075         (add_fix, add_frag): Now functions instead of macros.
1076         (m68k_reg_parse, m68k_ip, md_estimate_size_before_relax, get_num,
1077         s_data1, s_data2, s_bss): Use new *_section names, for
1078         compatibility with BFD_ASSEMBLER mode; rewrite switch statements
1079         to handle non-integral segT.
1080         (tc_coff_fix2rtype, tc_aout_fix_to_chars,
1081         tc_coff_symbol_emit_hook): Don't define for BFD_ASSEMBLER.
1082         (tc_gen_reloc): New routine for BFD_ASSEMBLER.
1083         (md_apply_fix, md_apply_fix_2): Renamed old md_apply_fix to
1084         md_apply_fix_2; new md_apply_fix definition varies interface
1085         depending on BFD_ASSEMBLER.
1086         (md_convert_frag, md_convert_frag_1): Likewise.  Use new *_section
1087         names.
1088
1089         * config/obj-vms.c: Include config.h.
1090         (version_string): Delete declaration.
1091         (Write_VMS_MHD_Records): Use GAS_VERSION instead.
1092         (vms_resolve_symbol_redef): New function, taken from VMS code in
1093         symbols.c.
1094         (_doprnt): Deleted.
1095         (VMS_Store_Struct, VMS_Def_Struct, VMS_Set_Struct,
1096         VMS_TBT_Block_End, get_VMS_time_on_unix, generate_suffix,
1097         VMS_Psect_Spec): Fixed to compiler under traditional C.
1098         * config/obj-vms.h: Use PARAMS macro.
1099         (vms_resolve_symbol_redef): Declare.
1100         (RESOLVE_SYMBOL_REDEFINITION): New macro.
1101         * symbols.c (colon): Remove some VMS-specific code, look for
1102         RESOLVE_SYMBOL_REDEFINITION macro instead.
1103
1104         * config/tc-m68k.c (m68k_ip): Don't try expanding DBcc
1105         instructions.
1106
1107         * config/tc-i386.c: Reordered some functions so inlining might
1108         work.  Use PARAMS in function declarations.
1109         (reloc): New routine.
1110         (md_assemble): Rearrange switch statements to work with
1111         non-integral segT.
1112
1113         * struc-symbol.h [BFD_ASSEMBLER]: Undefine
1114         SYMBOLS_NEED_BACKPOINTERS before defining it.
1115
1116         * subsegs.c (subseg_new_rest): Now static.
1117
1118         * read.c (pseudo_set): Better error message for difference of
1119         symbols in different frags.
1120
1121         * Makefile.in (check): Pass down some new variables, indicating
1122         pathname or program name for cc, nm, objdump.
1123
1124         * as.h (OUTPUT_FLAVOR): New macro.
1125         * config/tc-sparc.c (tc_gen_reloc): Use OUTPUT_FLAVOR.
1126
1127         * configure.in: Initialize bfd_gas properly.  Warn that ELF
1128         support is incomplete.
1129
1130 Thu Apr 15 22:39:05 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1131
1132         * read.c (float_cons): Accept null pointer return from md_atof.
1133         * config/tc-m68k.c (md_atof): Return null for success.
1134         * config/tc-sparc.c (md_atof): Ditto.
1135
1136 Thu Apr 15 16:04:39 1993  Roland H. Pesch  (pesch@fowanton.cygnus.com)
1137
1138         * doc/as.texinfo: formatting and comment cleanups; show SPARC
1139         alternative options in same style as other machines; simplify some
1140         conditional use; include GPL as separate file (from texinfo dir)
1141
1142         * doc/Makefile.in: (as.info) include directory containing GPL in
1143         makeinfo search path
1144
1145         * doc/h8.texi: new file; conditional settings for GAS manual
1146         on Hitachi chips
1147
1148 Tue Apr 13 15:31:40 1993  Roland H. Pesch  (pesch@fowanton.cygnus.com)
1149
1150         * doc/as.texinfo: mention SPARC architecture options.
1151
1152 Fri Apr  9 17:43:11 1993  Ken Raeburn  (raeburn@cygnus.com)
1153
1154         * configure.in: Rearranged whitespace in per-host/per-target
1155         sections.  Added hooks for dropping in HPPA support (not included
1156         yet).  Separate out overrides of variables based on target format
1157         and bfd-gas selection from actual target-specific commands.  Add
1158         error message for recognized but unsupported format name.
1159
1160 Fri Apr  9 09:05:47 1993  Ian Lance Taylor  (ian@cygnus.com)
1161
1162         * config/obj-ecoff.h (ecoff_build_lineno): Make ilineMax in
1163         symbolic header match cline in FDR; the native linker seems to
1164         want that.
1165
1166 Thu Apr  8 15:51:28 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
1167
1168         * doc/Makefile.in: as.texinfo is in $(srcdir).  Use
1169         $(srcdir)/as.texinfo explicitly in several places
1170
1171 Thu Apr  8 15:15:02 1993  Roland H. Pesch  (pesch@fowanton.cygnus.com)
1172
1173         * doc/Makefile.in: update dvi, clean targets for new source 
1174                            file structure
1175
1176 Thu Apr  8 12:52:46 1993  Ian Lance Taylor  (ian@cygnus.com)
1177
1178         * config/ho-decstatn.h: Define BROKEN_ASSERT if not __GNUC__,
1179         rather than undefining know.
1180         * configure.in: Match ultrix*, not just ultrix.
1181
1182 Wed Apr  7 20:18:10 1993  Roland H. Pesch  (pesch@fowanton.cygnus.com)
1183
1184         * doc/as.texinfo: converted conditional markup to use new
1185         Texinfo facilities, avoiding m4.
1186
1187         * doc/as-all.texinfo, all.m4, pretex.m4: deleted.
1188
1189         * doc/Makefile.in: recast doc configuration to use a link to an
1190         included texinfo file.
1191
1192         * doc/all.texi: settings for generic form of documentation.
1193
1194 Tue Apr  6 11:56:21 1993  Ian Lance Taylor  (ian@cygnus.com)
1195
1196         * read.c (cons): Zero out frag when creating reloc.
1197
1198 Mon Apr  5 09:41:58 1993  Ian Lance Taylor  (ian@cygnus.com)
1199
1200         * config/tc-mips.c (gp_reference): Certain magic symbols can never
1201         be referenced off the GP register.
1202
1203         * app.c (do_scrub_next_char): Handle states 9 and 10 correctly
1204         when dealing with characters of type LEX_IS_TWOCHAR_COMMENT_1ST,
1205         LEX_IS_STRINGQUOTE, and LEX_IS_ONECHAR_QUOTE.
1206
1207         * config/te-irix.h: New file; irix needs a different LOCAL_LABEL
1208         definition from other MIPS targets.
1209         * configure.in (mips-*-irix): Use emulation irix.
1210
1211 Sun Apr  4 15:21:09 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1212
1213         * config/tc-h8500.c: Get relax size of branch instructions right,
1214         (get_operand): Parse @sp+ correctly.
1215
1216 Fri Apr  2 15:59:49 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1217
1218         * subsegs.h (segment_info_type) [BFD_ASSEMBLER]: Don't include
1219         COFF section header field.
1220
1221         * configure.in: Print error message if host or target is not
1222         supported.
1223
1224         * configure.in: If with-bfd-assembler, use obj-coff instead of
1225         obj-coffbfd.
1226
1227         * config/ho-generic.h: Include string.h.
1228
1229 Fri Apr  2 08:54:57 1993  Ian Lance Taylor  (ian@cygnus.com)
1230
1231         * config/tc-mips.h (LOCAL_LABEL): Treat any label starting with
1232         '$' as local, for any object file format.
1233
1234         * config/tc-mips.c (macro): Optimizations to branching code and a
1235         couple of bug fixes from ralphc@pyrps5.eng.pyramid.com (Ralph
1236         Campbell).
1237
1238         * config/ho-irix.h: New file; if not gcc, define BROKEN_ASSERT.
1239         * configure.in (mips-sgi-irix*): Set gas_host to irix.
1240
1241 Wed Mar 31 17:53:54 1993  Ian Lance Taylor  (ian@cygnus.com)
1242
1243         * subsegs.c (subseg_new): Set output_section of new section.
1244         * as.c (perform_an_assemly_pass): Don't set output_section here.
1245         * expr.c (expr_part, expr): Turn off section assertions for ECOFF,
1246         since it has additional sections.
1247         * read.c (s_lcomm): For MIPS ECOFF, put small objects in .sbss,
1248         not bss_section.
1249         * config/obj-ecoff.h (TARGET_SYMBOL_FIELDS): Added
1250         ecoff_undefined field.
1251         * config/obj-ecoff.c (obj_symbol_new_hook): Initialize
1252         ecoff_undefined field.
1253         (add_file): If using stabs, just output a stabs symbol rather than
1254         creating a new fdr.
1255         (obj_ecoff_begin, obj_ecoff_bend): Ignore line number by reading
1256         it with get_absolute_expression, rather than skipping it by hand.
1257         (obj_ecoff_loc): If using stabs, just output a stabs symbol rather
1258         than ECOFF line number information.
1259         (obj_ecoff_stab): Accept non-zero values for stabs line number.
1260         (ecoff_build_symbols): Set ifilesym correctly.  Set storage class
1261         to small, undefined and/or readonly sections if appropriate.
1262         Don't output symbol names containing \001 characters.
1263         (ecoff_frob_file): Make sure at least one fdr is output.
1264         * config/tc-mips.h: Define TC_MIPS.
1265         * config/tc-mips.c (g_switch_value): New static variable.
1266         (md_assemble): Set gp size of output BFD.
1267         (gp_reference): New function; returns 1 if expression can be
1268         accesssed via gp.  Always returns 0 if not using ECOFF.
1269         (macro_build): Convert BFD_RELOC_LO16 to BFD_RELOC_MIPS_GPREL if
1270         possible.
1271         (macro): Generate sequences using gp if possible.
1272         (md_parse_option): Ignore -EL and -EB.  Parse -G.
1273         (md_apply_fix): Added BFD_RELOC_MIPS_GPREL to ignored case.
1274         (s_change_sec): Handle .rdata and .sdata for ECOFF.
1275         (s_extern): Mark symbol as external.  Set ecoff_undefined field.
1276
1277 Tue Mar 30 10:11:41 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1278
1279         * output-file.c (output_file_create): Don't call as_perror for
1280         filename rejected by application.
1281
1282         * as.c (main) [BFD_ASSEMBLER]: If errors occur, close and unlink
1283         the output file.
1284
1285         * doc/as.texinfo: Don't use @value in node names for the moment;
1286         references don't appear to work right.
1287
1288         * as.h (const, volatile): Put these definitions back, and use
1289         them.
1290
1291         * doc/as.texinfo: First pass at using new texinfo features --
1292         variables, conditional tests.  Far from complete.
1293
1294 Mon Mar 29 16:05:40 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1295
1296         * read.c: Temporary hack to handle some 64-bit constants.  This
1297         should be redone later.
1298         (target_big_endian): Declare.
1299         (big_cons): If it's set, reverse order of bytes being copied.
1300         * config/tc-sparc.c (md_begin): Set target_big_endian.
1301
1302         * read.c (s_ignore): Delete declaration of is_end_of_line.
1303
1304         * config/obj-coffbfd.c (yank_symbols): Build list of file symbol
1305         forward pointers properly.
1306
1307 Mon Mar 29 13:47:33 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1308
1309         * config/obj-coffbfd.c (do_relocs_for): Fix bug where nrelocs
1310         wasn't being stored into scnhdr.
1311         * config/obj-coffbfd.h: Add prototype of s_get_segment.
1312         * read.c (TC_START_LABEL): Default definition.
1313         (read_a_source_file): Use TC_START_LABEL macro to work out
1314         if a label has been seen.
1315
1316 Mon Mar 29 12:56:56 1993  Ian Lance Taylor  (ian@cygnus.com)
1317
1318         * configure.in: Set BFDDEF and BFDLIB at the top of Makefile, not
1319         the bottom (make expands variables in dependencies when the
1320         dependencies are read, not when they are used).
1321
1322         * config/obj-coffbfd.c (fill_section): Don't set NOLOAD bit for
1323         a29k .bss section; the mondfe program doesn't like it.
1324
1325 Sun Mar 28 08:12:53 1993  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
1326
1327         * config/tc-m68k.c: Use PARAMS macro, and use CONST instead of
1328         const.
1329         (current_architecture): Don't need initializer.
1330
1331 Fri Mar 26 08:12:48 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1332
1333         * doc/none.m4: Define Z8000.
1334         * doc/Makefile.in (as-*.texinfo): Refer to $(srcdir).  Remove the
1335         texinfo file before recreating it.
1336         (TEXI2DVI): Need to set TEXINPUTS if "make as.dvi" is to work in
1337         this directory.
1338         (srcdir): Delete second, bogus definition.
1339         (as.info): Look for as-*.texinfo in current directory rather than
1340         in $(srcdir).
1341         (as.dvi): Ditto.
1342         (dvi): New rule.
1343         * doc/configure.in: Create links to all as-*.texinfo files in the
1344         source directory, if that's not the current directory.
1345
1346         * configure.in (per-host):  Accept MIPS host with BSD version
1347         number.
1348         (per-target): Classify i486 as i386.  Use generic cpu_type instead
1349         of target_cpu in selecting format etc.
1350
1351         * app.c (do_scrub_next_char): Use .appfile, not .app-file.
1352         * read.c (potable): Change .app-file to .appfile.
1353
1354         * config/ho-decstatn.h: Renamed from ho-decstation.h.
1355         * configure.in: Adjusted.
1356
1357         * config/obj-bfd-sunos.*: Unused; deleted.
1358
1359         * Makefile.in (version.c, vers-stamp): Deleted.
1360         (config.h): Define GAS_VERSION.
1361         * as.c (version_string): Deleted declaration.
1362         (main): Look for GAS_VERSION instead.
1363
1364         * doc/as.texinfo: Updated description of -a* (listing) options,
1365         and describe how to pass them through from gcc.
1366
1367         * config/obj-coffbfd.c (do_relocs_for): Don't allocate storage or
1368         process relocs if there aren't any relocs to process.  Avoids
1369         malloc/free bug on SCO too.
1370
1371         * as.h: Move local include files below system include files, to
1372         avoid some redefinition complaints on some systems.
1373         (const, volatile): Don't need these conditionally defined if we
1374         use CONST and VOLATILE from ansidecl.h.
1375         (seg_name): Use CONST, not const.
1376
1377 Fri Mar 26 10:22:04 1993  Ian Lance Taylor  (ian@cygnus.com)
1378
1379         * config/tc-mips.c: Reindented to GNU standards.
1380
1381 Thu Mar 25 08:59:14 1993  Ian Lance Taylor  (ian@cygnus.com)
1382
1383         * config/obj-coffbfd.c (do_relocs_for): Remove a29k special case.
1384         (fixup_segment): Add a29k special case; the linker is not prepared
1385         to see a segment offset here.
1386
1387         * app.c (do_scrub_next_char): Added new state, 10, modifying state
1388         9 to only keep a space in between identifier characters.
1389
1390 Wed Mar 24 02:16:22 1993  david d `zoo' zuhn  (zoo at poseidon.cygnus.com)
1391
1392         * Makefile.in: add dvi target; as-$(config).texinfo might live in
1393         srcdir, might be in objdir.
1394
1395         * doc/Makefile.in: dvi depends on as.dvi
1396
1397 Mon Mar 22 23:59:13 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
1398
1399         * Makefile.in: add installcheck target
1400
1401 Mon Mar 22 10:19:00 1993  Ian Lance Taylor  (ian@cygnus.com)
1402
1403         * config/tc-mips.c (macro): Use $AT for any floating point load.
1404
1405 Sat Mar 20 12:50:51 1993  Ken Raeburn  (raeburn@urth.cygnus.com)
1406
1407         * config/tc-m68k.c (m68k_ip): For operand type 'M', reject
1408         bignums, but don't emit error message.
1409
1410 Fri Mar 19 21:02:19 1993  Jim Wilson  (wilson@sphagnum.cygnus.com)
1411
1412         * Makefile.in (targ-cpu.o): Depend on config.h.
1413
1414 Wed Mar 17 16:44:06 1993  Ian Lance Taylor  (ian@cygnus.com)
1415
1416         * app.c (do_scrub_next_char): Added new state, 9, to avoid
1417         dropping a space immediately following an identifier.
1418         * expr.c, write.c: Rewrote assert expressions to not use multiple
1419         lines; I don't think that can be done portably.
1420         * config/tc-mips.c (macro): Use $AT if target register is zero in
1421         load instruction, which it can be for a floating point load.
1422
1423 Mon Mar 15 12:17:28 1993  Ian Lance Taylor  (ian@cygnus.com)
1424
1425         * write.c (write_contents): Compute the relocs before writing out
1426         the section contents.
1427         * config/obj-ecoff.h, config/obj-ecoff.c: Numerous changes to get
1428         symbol table and values right.
1429         * config/tc-mips.h (LOCAL_LABEL): If OBJ_ECOFF, any label starting
1430         with $L is local.
1431         * config/tc-mips.c (tc_gen_reloc): If OBJ_ECOFF, adjust the addend
1432         by the section vma.
1433
1434         * config/z8k.mt (TARG_CPU_DEPENDENTS): The relevant file is
1435         z8k-opc.h, not z8k.h.
1436
1437         * config/obj-coffbfd.c (obj_coff_endef): Correct test for .bf
1438         symbol.
1439
1440 Fri Mar 12 18:33:36 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
1441
1442         * configure.in: recognize sparc-sun-solaris2* instead of -solaris2
1443
1444 Fri Mar 12 12:00:07 1993  Ian Lance Taylor  (ian@cygnus.com)
1445
1446         * expr.c, write.c: Ultrix native 4.2 cc requires assert condition
1447         to be on a single line.
1448
1449 Thu Mar 11 17:56:22 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1450
1451         * Makefile.in (config.h): Create file, writing out definitions of
1452         target cpu, alias, and canonical name.
1453         (ALL_CFLAGS): No longer define TARGET_CPU.
1454
1455         * Makefile.in (check): Print a message, instead of quitting
1456         silently.
1457
1458         * as.c (main): Don't catch any signals, for now.
1459
1460         * version.c: Deleted.
1461         * Makefile.in: Generate it, putting in only the version number
1462         itself.
1463         (VERSION): New variable.
1464         * as.c: Include config.h.
1465         (main): Reformatted version string.  Include target alias.  Don't
1466         print if not requested (i.e., unknown -v argument).
1467
1468         * as.c (stralloc): Deleted.
1469         (main): Call strdup instead.
1470
1471         * configure.in: Handle all 68300 series chips.
1472         * config/tc-m68k.c: Include config.h.
1473         (md_assemble): Assume TARGET_CPU is defined.  Accept some 68300
1474         series cpus as defaults.
1475         (md_parse_option): Accept some m68300 series CPUs as defaults.
1476
1477 Wed Mar 10 17:41:16 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1478
1479         * as.c (EXIT_SUCCESS, EXIT_FAILURE): Define to normal values if
1480         not already defined.
1481         (main, got_sig): Use them.
1482         * config/ho-vms.h (EXIT_SUCCESS, EXIT_FAILURE): Reverse default
1483         values.
1484
1485 Tue Mar  9 07:40:06 1993  Ian Lance Taylor  (ian@cygnus.com)
1486
1487         * config/obj-ecoff.c, config/obj-ecoff.h: Preliminary ECOFF
1488         support.
1489
1490         * config/tc-mips.h (TARGET_FORMAT): Define based on OBJ_AOUT vs.
1491         OBJ_ECOFF as well as TARGET_BYTES_*_ENDIAN.
1492         (struct loc, struct proc, struct file): Moved to tc-mips.c within
1493         #ifndef OBJ_ECOFF block, since ECOFF uses different versions.
1494         * config/tc-mips.c: Rearranged for ECOFF support.  Added
1495         prototypes for all static functions.  Moved existing minimal
1496         debugging format support info #ifndef OBJ_ECOFF blocks.
1497         (macro_build_lui): Eliminated sign_extend argument, because ECOFF
1498         does not support a non sign extended high 16 bits reloc.  Adjusted
1499         all callers accordingly.
1500         (tc_get_register): Renamed from get_register, and made non-static.
1501
1502         * config/mips-big.mt, config/mips-lit.mt: New files.  Define
1503         TARGET_BYTES_BIG_ENDIAN and TARGET_BYTES_LITTLE_ENDIAN,
1504         respectively.
1505         * configure.in (mips-*-bsd*): Use gas_target mips-lit.
1506         (mips-*-ultrix*, mips-*-irix*, mips-*-ecoff): New targets, using
1507         obj_format ecoff and gas_target mips-lit or mips-big.
1508
1509 Tue Mar  9 07:43:01 1993  Ken Raeburn  (raeburn@cygnus.com)
1510
1511         * version.c: Bump to version 2.0.1.
1512
1513 Tue Mar  9 07:40:06 1993  Ian Lance Taylor  (ian@cygnus.com)
1514
1515         * write.c (chain_frchains_together): Check that seg_info (section)
1516         is not NULL.
1517         (write_object_file): Call obj_frob_file after setting the symbols,
1518         not before.
1519
1520 Tue Mar  9 00:00:00 1993  Ken Raeburn  (raeburn@cygnus.com)
1521
1522         * Version 2.0 released.
1523
1524 Mon Mar  8 14:57:10 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1525
1526         * config/tc-i386.h (TC_COUNT_RELOC): Look for fx_addsy only.
1527
1528 Fri Mar  5 09:05:55 1993  Ian Lance Taylor  (ian@cygnus.com)
1529
1530         * read.h: Define stringer here.
1531         read.c, config/obj-ieee.c, config/obj-tcm88k.c: Not any of these
1532         places.
1533
1534 Thu Mar  4 11:52:23 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1535
1536         * read.c (s_space): Multiply repeat count by mult, not fill.
1537
1538 Thu Mar  4 05:20:42 1993  Ken Raeburn  (raeburn@cygnus.com)
1539
1540         * read.c: Include ctype.h.
1541
1542 Wed Mar  3 10:41:46 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1543
1544         Patches from Eric Youngdale:
1545         * make-gas.com: Find obstack.obj if it's not in the current
1546         directory.
1547         * read.c (s_ignore): Don't declare is_end_of_line.  It's
1548         redundant, and triggers a VMS gcc compiler bug.
1549
1550         * write.c (write_object_file): Macro SUB_SEGMENT_ALIGN now takes
1551         current segment as an argument.  (Ignored in all cases but VMS.)
1552         All callers and definitions changed.
1553
1554 Tue Mar  2 11:56:19 1993  Ian Lance Taylor  (ian@cygnus.com)
1555
1556         * listing.c: Cleaned up a bit, added prototypes, made NO_LISTING
1557         case compile again.
1558
1559 Tue Mar  2 08:53:34 1993  Ken Raeburn  (raeburn@cygnus.com)
1560
1561         * config/tc-m68k.c (isbyte): Accept all values from -255 to +255,
1562         so "~0x80" won't be rejected.
1563
1564         * config/obj-elf.c: No longer include elf/reloc.h.
1565         (obj_elf_section): Set SEC_READONLY and SEC_CODE for text section.
1566         (obj_elf_stab, obj_elf_desc): Deleted do-nothing and commented-out
1567         routines.
1568         (obj_elf_xstab): New routine.
1569         (obj_elf_set_size): Call as_warn, not fprintf.  Pass desired
1570         argument to s_ignore.  Put "#if 0" around unused code.
1571         (obj_pseudo_table): Use s_ignore instead of do-nothing routines.
1572         Call elf_xstabs for .stabs and .xstabs operators.
1573
1574         * config/tc-sparc.h (TARGET_FORMAT) [OBJ_ELF]: Now "elf32-sparc".
1575
1576         * write.c (relax_and_size_seg): Set SEC_RELOC only if fixups are
1577         present.
1578
1579         * configure.in: mips-bsd configuration was missing format spec.
1580         Should use aout.
1581
1582         * Makefile.in (Makefile): Depends on configure.in.
1583
1584         * config/tc-mips.c (append_insn): Don't check for alignment of
1585         frag in memory; alignment of instructions in section is a separate
1586         matter.
1587
1588         * config/tc-mips.c (macro_build_lui): Fix some assumptions of ANSI
1589         C availability.
1590
1591         * listing.h: Always provide function declarations, not macros, so
1592         pcc won't lose.
1593
1594 Tue Mar  2 00:50:43 1993  John Gilmore  (gnu@cygnus.com)
1595
1596         * CONTRIBUTORS:  Update Gilmore entry.
1597
1598 Wed Feb 24 14:58:19 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1599
1600         * frags.c (frag_init): New function.
1601         (zero_address_frag, bss_address_frag): Now initialized at run
1602         time.
1603         * as.c (main): Call frag_init.
1604
1605 Wed Feb 24 10:32:42 1993  Ian Lance Taylor  (ian@cygnus.com)
1606
1607         * app.c (do_scrub_next_char): In LEX_IS_LINE_COMMENT_START case:
1608         Don't unget ch2 if we didn't get it.
1609
1610 Wed Feb 24 04:14:07 1993  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
1611
1612         * doc/Makefile.in (TEXIDIR): Updated for new layout.
1613
1614         * config/tc-sparc.c (s_common): Add support for ELF version.
1615         (tc_gen_reloc) [BFD_ASSEMBLER]: New function.
1616         * config/tc-sparc.h (TARGET_ARCH, TARGET_FORMAT) [BFD_ASSEMBLER]:
1617         New macros.
1618         (md_convert_frag): New macro.
1619
1620         * config/tc-m68k.c (m68k_ip): For PC-relative addressing of a
1621         symbol, fix the offset so "+2" isn't required.
1622
1623         * config/tc-i960.c (line_comment_chars, line_separator_chars):
1624         Define as common/bss.
1625         (op_hash, reg_hash, areg_hash, iclasses_seen, br_cnt): Default C
1626         initializers are sufficient.
1627
1628         * config/obj-aout.h [BFD_ASSEMBLER]: Include libaout.h from bfd.
1629         (TARGET_FORMAT) [BFD_ASSEMBLER]: Default to "a.out".
1630         (S_SET_*, S_GET_*, obj_frob_symbol) [BFD_ASSEMBLER]: New macros.
1631         (S_SET_TYPE) [!BFD_ASSEMBLER]: New macro.
1632         * config/obj-aout.c: Use PARAMS macro for declarations.  Remove
1633         "IGNORE_DEBUG" conditional, since both branches are identical.
1634         Use S_SET_TYPE, S_GET_TYPE, and S_GET_DESC instead of directly
1635         referencing symbol structure members.
1636         (obj_aout_frob_symbol) [BFD_ASSEMBLER]: New function.
1637
1638         * as.h (struct frag): Reordered a couple of fields for better
1639         packing.
1640
1641         * write.c (record_alignment) [BFD_ASSEMBLER]: Record it in the
1642         section info.
1643         (write_contents) [BFD_ASSEMBLER]: New function.
1644         (write_object_file) [BFD_ASSEMBLER]: Always handle -R here.  Call
1645         fix_new with BFD_RELOC_NONE instead of 0 or NO_RELOC.  Call
1646         obj_frob_file, obj_frob_symbol, tc_frob_symbol if defined.
1647         (fixup_segment): Make sure common-section symbols get treated the
1648         same as undefined symbols.
1649         (fix_new) [BFD_ASSEMBLER]: Argument r_type is of type
1650         bfd_reloc_code_real_type.  Use seg_fix_{root,tail}P derived from
1651         section info.
1652         * write.h (fix_new): Update prototype.
1653
1654         * tc.h (md_operand, md_convert_frag, tc_headers_hook,
1655         md_section_align, md_undefined_symbol): Don't provide prototypes
1656         if these are defined as macros.
1657         (md_convert_frag) [BFD_ASSEMBLER]: BFD version needs bfd and
1658         section passed.
1659
1660         * symbols.c (symbol_new): Argument NAME is now pointer to const.
1661         Simplified STRIP_UNDERSCORE code.  Remove assumptions about null
1662         pointers in freshly allocated storage.  [BFD_ASSEMBLER]: Get new
1663         BFD symbol.
1664         (colon): Display other/desc fields of redefined symbol only if
1665         S_GET_OTHER and S_GET_DESC are defined.
1666         (symbol_make): Argument NAME is now pointer to const.
1667         (symbol_find, symbol_find_base): Likewise.
1668         (S_IS_*, S_GET_*, S_SET_*) [BFD_ASSEMBLER]: New functions.
1669         * symbols.h: Fix prototypes for new const arguments.  Add
1670         prototypes for BFD_ASSEMBLER S_* functions.
1671
1672         * subsegs.c (subseg_change) [BFD_ASSEMBLER]: BFD version of code
1673         for changing to an existing section.
1674         (subseg_new_rest) [BFD_ASSEMBLER]: Split off from subseg_new,
1675         called by subseg_new and subseg_set.
1676         (subseg_new) [BFD_ASSEMBLER]: Rewritten to change to new section,
1677         given section name and subseg number.
1678         (subseg_set) [BFD_ASSEMBLER]: New function; change to a possibly
1679         new section/subsection.
1680
1681         * read.c: Don't include ctype.h.
1682         (cons) [BFD_ASSEMBLER]: For undefined symbols, use BFD_RELOC_32
1683         for now; should be machine-dependent.
1684
1685         * configure.in: Accept *-*-elf and *-*-solaris* as ELF format
1686         targets, forcing BFD use.
1687
1688 Wed Feb 17 18:59:03 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1689
1690         * config/tc-sparc.c: Use PARAMS macro for static function
1691         declarations.  Use BFD_RELOC_ macros everywhere, with
1692         compatibility macros declared for non-BFD mode.
1693         (struct sparc_it) [BFD_ASSEMBLER]: Use bfd_reloc_code_real_type
1694         instead of enum reloc_type.
1695         (emit_sparc_reloc): Commented-out function deleted.
1696         (md_convert_frag): Deleted.
1697         (tc_aout_pre_write_hook): Don't define for BFD_ASSEMBLER.
1698         (md_apply_fix): Changed calling sequence (conditionally) for BFD
1699         version.
1700         * config/tc-sparc.h (md_convert_frag): New macro.
1701
1702         * config/obj-aout.c (obj_aout_stab): Refer to undefined_section,
1703         not SEG_UNKNOWN.  Use S_SET_TYPE, S_GET_TYPE, S_GET_DESC instead
1704         of referencing fields directly.
1705
1706         * write.c (cvt_frag_to_fill): New function; extracted from
1707         write_object_file.
1708         (write_object_file) [! BFD_ASSEMBLER]: Call it.
1709         (relax_and_size_seg) [BFD_ASSEMBLER]: New function; relax section
1710         and set its size and flags.
1711
1712         * struc-symbol.h (struct symbol) [BFD_ASSEMBLER]: Replace some
1713         fields with BFD equivalents.  Turn on back-pointers, and add
1714         target-specific fields at end.
1715
1716 Thu Feb 11 09:20:37 1993  Ian Lance Taylor  (ian@cygnus.com)
1717
1718         * config/obj-coffbfd.c (fill_section): Don't set vaddr here.
1719         (write_object_file): Set it here instead, so that fixup_segment
1720         can see the correct value.
1721
1722 Mon Feb  8 13:56:17 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1723
1724         * write.c (write_object_file): Check for errors and warnings and
1725         bail out before processing contents.
1726         (chain_frchains_together_1): New function, does most of the work
1727         of remove_subsegs.
1728         (chain_frchains_together) [BFD_ASSEMBLER]: New function.
1729         (remove_subsegs) [! BFD]: Call it.
1730         (write_object_file) [BFD_ASSEMBLER]: Converted to use BFD
1731         structures and routines.
1732
1733         * config/obj-elf.*: New files.
1734
1735         * config/mips.mt, config/rs6000.mt: Deleted.
1736
1737         * config/h8300.mt: Don't specify compiler here.
1738
1739         * config/z8k.mt: The z8k code depends on the z8k opcode table,
1740         not the h8300 one.
1741         * config/tc-z8k.h: Comment fix.
1742
1743         * write.c: Reordered some functions for better inlining.
1744         (fixup_segment): Linkrelax code is no longer conditional on
1745         TC_I960.
1746
1747 Thu Feb  4 12:45:16 1993  Steve Chamberlain  (sac@thepub.cygnus.com)
1748
1749         * config/{h8500.mt, tc-h8500.c, tc-h8500.h, obj-coffbfd.c,
1750         obj-coffbfd.h}: support for the H8/500
1751
1752 Wed Feb  3 19:28:18 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1753
1754         * config/obj-vms.h (SUB_SEGMENT_ALIGN): Define VMS version here.
1755         * write.c (write_object_file): Not here.
1756         (fix_new): Initialize fx_addnumber.
1757
1758         * listing.c: Don't include target-cpu.h explicitly, since as.h
1759         includes it.
1760
1761 Thu Jan 28 00:35:40 1993  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
1762
1763         * write.h [BFD_ASSEMBLER]: Don't declare next_object_file_charP,
1764         *_fix_root, *_fix_tail, seg_fix_rootP, seg_fix_tailP.
1765         (struct fix): Reordered fields for compactness and efficiency.
1766         Converted some logical fields to 1-bit fields.
1767
1768         * config/obj-aout.h: Use PARAMS.
1769         [BFD_ASSEMBLER]: Don't define/declare AOUT_MACHTYPE, seg_N_TYPE,
1770         N_TYPE_seg, DEFAULT_MAGIC_NUMBER_FOR_OBJECT_FILE.
1771
1772         * read.c: Don't include listing.h; as.h includes it.  Removed
1773         DONTDEF code.
1774         [BFD_ASSEMBLER]: Include subsegs.h.
1775         (old_buffer, new_broken_words): Default initialization is
1776         sufficient.
1777
1778         * output-file.c [BFD_ASSEMBLER]: Include bfd.h, default TARGET_MACH
1779         to 0, define stdoutput.
1780         (output_file_create) [BFD_ASSEMBLER]: Call bfd_perror on failure.
1781         Call bfd_set_arch_mach.
1782         (output_file_close) [BFD_ASSEMBLER]: Call bfd_close, not
1783         bfd_close_all_done.  Call bfd_perror on failure.
1784         (output_file_append) [BFD_ASSEMBLER]: Don't define.
1785
1786         * config/m68kcoff.mt (LOCAL_LOADLIBES): Delete definition.
1787
1788         * subsegs.h (segment_info_type): Always define.  Omit field scnhdr
1789         if not MANY_SEGMENTS.  Define new field bfd_section if
1790         BFD_ASSEMBLER.
1791         (seg_info): New macro.
1792
1793         * expr.c, input-scrub.c: Use PARAMS macro.  Deleted unused
1794         variables, and some irrelevant comments.
1795
1796         * Makefile.in (ALL_CFLAGS): Include $(BFDDEF).
1797         (LIBS): Include $(BFDLIB).  Don't bother with $(CLIB).
1798         * configure.in:  Permit --with-bfd-assembler now, with a warning.
1799         Variable need_bfd is now a boolean, as is new variable bfd_gas.
1800         Set BFDDEF and BFDLIB in Makefile when appropriate.
1801
1802         * as.c: Removed "#ifdef DONTDEF" and "#ifdef comment" code.
1803         (main): Refer to flag_always_generate_output instead of
1804         flagseen['Z'].
1805
1806         * as.c (main) [BFD_ASSEMBLER]: Open output bfd.
1807         (*_section) [BFD_ASSEMBLER]: Define them.
1808         (perform_an_assembly_pass) [BFD_ASSEMBLER]: Initialize them, and
1809         set section flags when appropriate.
1810         * as.h (SEG_NORMAL) [BFD_ASSEMBLER]: Require that the specified
1811         section is not absolute, undefined, or an assembler internal one.
1812         (absolute_section, undefined_section): Always define.
1813         * expr.c, read.c, symbols.c: Refer to *_section, not SEG_*; break
1814         switch statements into if-else trees.
1815         * symbols.c [MANY_SEGMENTS]: Deleted redundant definitions of
1816         SEG_BSS and SEG_DATA.
1817
1818         * as.h (frag_now_fix): New macro.
1819         * symbols.c (colon): Use it.
1820
1821 Wed Jan 27 21:43:53 PST 1993  Ralph Campbell  (ralphc@pyramid.com)
1822
1823         * config/tc-mips.c:  Added mips support for mips-dec-bsd.
1824         * config/tc-mips.h:  Added mips support for mips-dec-bsd.
1825         * config/ho-mipsbsd.h:  Added mips support for mips-dec-bsd.
1826         * config/mips-opcode.h:  Added mips support for mips-dec-bsd.
1827         * configure.in:  Added mips support for mips-dec-bsd.
1828         * atof-generic.c:  Define TRUE and FALSE if not defined.
1829
1830 Thu Jan 21 12:48:19 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1831
1832         * version.c: Bumped version number to 1.93.05.
1833
1834 Wed Jan 20 17:11:53 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1835
1836         * config/obj-coff.c (obj_emit_relocations): Don't use #elif.
1837         (obj_emit_lineno): Don't need return at end of void function.
1838         (obj_symbol_new_hook): Ditto.
1839
1840         * config/tc-m68k.c: Removed some unused code.
1841         (tc_aout_fix_to_chars): Array nbytes_r_length is now const.
1842
1843         * config/tc-m68k.h (TC_COUNT_RELOC): Don't emit reloc if only
1844         offset field is set.
1845
1846 Fri Jan  8 05:44:49 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1847
1848         * config/tc-sparc.c (architecture_requested, warn_on_bump,
1849         md_relax_table): Use default zero initialization.
1850         (s_reserve): Since SEG_E2 is equivalent to SEG_BSS, just use the
1851         latter, instead of selecting with preprocessor conditionals.
1852
1853 Thu Jan  7 08:58:21 1993  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
1854
1855         * configure.in: recognise all sparclite variants
1856
1857 Thu Jan  7 05:25:25 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1858
1859         * read.c (s_data) [!BFD_ASSEMBLER]: Fix typo in 4 Jan change --
1860         accidentally changed to use subseg_change where it should have
1861         been subseg_new.
1862
1863 Tue Jan  5 08:42:16 1993  Ken Raeburn  (raeburn@cambridge.cygnus.com)
1864
1865         * expr.c (operand): If character other than comma or newline is a
1866         logical end-of-line character, use the newline case.
1867         From Eric Youngdale:
1868         (operand): Set X_add_number field for floating-point numbers.
1869         (operand): Treat zero byte as end-of-operand.
1870
1871         * configure.in (per-target): Look for with_bfd_assembler option.
1872         For now, only accept "no", until the merge is done.
1873
1874         Merged changes from Eric Youngdale (youngdale@v6550c.nrl.navy.mil):
1875         * as.c, flonum-konst.c, hex-value.c, input-file.c, version.c,
1876           config/obj-aout.h, config/obj-vms.c: VMS -> HO_VMS.
1877         * read.c: Finish conversion to S_* macros in the VMS only
1878           parts of the program. Add "const" modifier to hex_value.
1879         * as.c, read.c, symbols.c, write.c: Change "ifdef VMS" to
1880           "ifdef OBJ_VMS".
1881         * expr.c: Add "const" modifier to hex_value.
1882         * symbols.c: Finish conversion to S_* macros in the VMS only
1883           parts of the program.  Add "const" modifier to
1884           md_[long,short]_jump_size. Remove declaration of const_flag
1885           (which will be declared in obj-vms.h).
1886         * write.c: Add "const" modifier to md_[long,short]_jump_size.
1887           Fix arguments to VMS_write_object_file.
1888         * config-gas.com: New file.  Script for VMS systems to set up the
1889           configuration to build gas for VMS, and create config.status.
1890         * make-gas.com: Redone to work with new scheme.
1891         * obj-vms.c: Patch to fix bug where we were not correctly parsing the
1892           stabs directives.
1893         * obj-vms.c:  Define macros COPY_LONG and COPY_SHORT which
1894           will swap bytes if needed on a big endian system.  Use throughout
1895           as needed.
1896         * obj-vms.c (obj_aout_stab):  Add code to generate listing file.
1897         * obj-vms.c (VMS_typedef_parse): Add alias to correctly handle certain
1898           types of malformed stabs.  Change parsing algorithm so that we are
1899           more certain of having all of the information that we need on hand.
1900         * obj-vms.c (final_forward_reference):  New function, used to help
1901           resolve the data types of as many struct elements as possible
1902           when some part of the struct is not fully defined by the compiler.
1903         * obj-vms.c (VMS_LSYM_Parse):  Correctly handle case of continuation
1904           stabs directives.
1905         * obj-vms.c (VMS_write_object_file): Define all vtable psects
1906           as symbols as well in the object file.  Look for external functions
1907           that start with "__vt.", and turn them into variables, since the
1908           g++ compiler is incapable of doing this.
1909         * tc-vax.c: Add '1' option for backward compatibility with older GCC
1910           versions.
1911         * bignum-copy.c (bignum_copy): Fix bug where we pad with zeroes.
1912         * input-scrub.c (as_where): Fix bug where as would crash if we did not
1913           have the name of the source file yet.
1914         * config/ho-vms.h: define HO_VMS, not HO_VAX.
1915
1916 Mon Jan  4 05:17:26 1993  Ken Raeburn  (raeburn@cygnus.com)
1917
1918         * read.c (s_data): Always use "data_section", since it'll map to
1919         SEG_DATA or SEG_E1 if needed.
1920         (s_lcomm): Likewise with bss_section.
1921         (s_fill): Use memset, not bzero.
1922
1923 Thu Dec 31 04:29:27 1992  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
1924
1925         * read.c: Deleted some code under "#ifdef DONTDEF" that was for
1926         handling GDB symbol table data.
1927
1928         * config/obj-aout.h (segment_name): Delete definition.
1929         (seg_name): Delete declaration.
1930         * config/obj-bout.h (segment_name, seg_name): Ditto.
1931         * config/obj-vms.h (segment_name, seg_name): Ditto.
1932         * config/obj-coff.h (segment_name): Ditto.
1933         * config/obj-coffbfd.h (segment_name): Ditto.
1934
1935         * Changes for BFD_ASSEMBLER:
1936         * obj.h (obj_crawl_symbol_chain): Declare only if not
1937         BFD_ASSEMBLER.
1938         (obj_header_append, obj_pre_write_hook): Ditto.
1939         * as.h (stdoutput): New var, defined only if BFD_ASSEMBLER.
1940         (segT) [BFD_ASSEMBLER]: New typedef for "asection *".
1941         (segment_name) If BFD_ASSEMBLER, look up BFD section name;
1942         otherwise, use seg_name array.
1943         (seg_name): Declare only if not BFD_ASSEMBLER.
1944         (section_alignment): Declare only if not BFD_ASSEMBLER.
1945         (big_section, reg_section, pass1_section, diff_section,
1946         absent_section, text_section, data_section, bss_section): If
1947         BFD_ASSEMBLER, declare as variables; otherwise, declare as macros,
1948         mapping to segT enum values.
1949         (tc_aout_fix_to_chars, next_object_file_charP): Force parse errors
1950         if these are used or defined, if BFD_ASSEMBLER.
1951         (subseg_set, subseg_new) [BFD_ASSEMBLER]: Functionality of old
1952         subseg_new split into two functions.
1953         (SEG_NORMAL): For BFD_ASSEMBLER, always return true, for now.
1954
1955         * as.h (volatile): Don't define if already defined.
1956         (had_errors, had_warnings): Provide prototypes for ANSI C even if
1957         NO_STDARG.
1958         (as_bad, as_fatal, as_tsktsk, as_warn): For GNU C version 2,
1959         declare with format attribute for -Wformat checking.
1960
1961 Wed Dec 30 10:18:57 1992  Ian Lance Taylor  (ian@cygnus.com)
1962
1963         * app.c, config/tc-*.c: Don't include read.h, since it is already
1964         included by as.h.
1965
1966         * These are based on patches from Minh Tran-le
1967         <mtranle@paris.intellicorp.com>.
1968         * configure.in (i[34]86-ibm-aix*): Accept i486 for host.  Use
1969         obj_format coffbfd and gas_target i386coff for target.
1970         (i[34]86-*-isc*): New host (uses sysv).
1971         * config/i386aix.mt: Removed (no longer used).
1972         * config/mh-i386aix (RANLIB): Use true rather than /bin/true.
1973         (MINUS_G): Removed.
1974         (LDFLAGS): Added, defined as -shlib.
1975         * config/te-i386aix.h (REVERSE_SORT_RELOCS): Undefine.
1976         * config/te-sco386.h (LOCAL_LABEL): Don't define.
1977         (DOT_LABEL_PREFIX): Define.
1978         * expr.c (operand): If DOT_LABEL_PREFIX, use .L0\001 as a label
1979         name rather than L0\001.
1980         * read.c (s_lcomm): Make a frag in SEG_BSS rather than using
1981         local_bss_counter.
1982         * symbols.c, symbols.h (local_bss_counter): Removed.
1983         * write.c (write_object_file): bss no longer uses
1984         local_bss_counter.  Pass correct data and bss size to
1985         VMS_write_object_file.
1986         * config/obj-vms.c (VMS_write_object_file): Accept bss size as
1987         argument, rather than using local_bss_counter.
1988         * config/tc-m88k.c (s_bss): Don't use local_bss_counter.
1989         * config/tc-sparc.c (s_reserve): Don't use local_bss_counter.
1990         * config/obj-coffbfd.c (had_lineno, had_reloc): Removed.
1991         (size_section): Restored sanity check.
1992         (do_relocs_for): Base section address on s_paddr rather than
1993         computing it.  Adjust a29k R_IHIHALF special case to account for
1994         section paddr (used to require paddr to be zero).  If there are no
1995         reclos, set s_relptr to 0.  Set relocation size in object_headers.
1996         (fill_section): Always set s_vaddr here, removing
1997         ZERO_BASED_SEGMENTS case.  Force s_scnptr for bss to 0.  Don't set
1998         NOLOAD for i386 .bss, because it confuses the SVR3 native linker.
1999         Set STYP_INFO for .comment.
2000         (coff_header_append): Use object headers and H_{SET,GET}_* macros.
2001         Make aouthdr writing depend on OBJ_COFF_OMIT_OPTIONAL_HEADER.
2002         (crawl_symbols): Handle 8 character section name correctly.  Use
2003         H_{SET,GET}_* macros.
2004         (do_linenos_for): Set lineno size in object_headers.
2005         (write_object_file): Use H_{SET,GET}_* macros.  Don't bother to
2006         set s_vaddr here.  If string_byte_count remains 4, set it back to
2007         0, and only write strings out if there are some.  Call
2008         fill_section before do_relocs_for and do_linenos_for.
2009         (obj_coff_section): Handle optional quoted second argument giving
2010         section characteristics.
2011         (obj_coff_bss): Added to handle .bss.
2012         (obj_coff_ident): Added to handle .ident (puts string in .comment
2013         section).
2014         (obj_coff_lcomm): Put common symbols in .bss, not .data.
2015         (fixup_mdeps): Change to segment.  Call frag_wane after
2016         md_convert_frag.
2017         (fixup_segment): Explicitly check S_IS_COMMON before making 386
2018         adjustment (already happened only for common symbols, but this is
2019         clearer).
2020         * config/obj-coffbfd.h (OBJ_COFF_OMIT_OPTIONAL_HEADER): Define.
2021         * config/tc-i386.c (s_bss): Don't use if I386COFF.
2022         (md_pseudo_table): Ignore .optim and .noopt.
2023         (tc_coff_sizemachdep): New function.
2024         * config/tc-i386.h (REVERSE_SORT_RELOCS): Undef, for SVR3
2025         compatibility.
2026         (LOCAL_LABEL): Removed definition.
2027         (DOT_LABEL_PREFIX): Defined.
2028
2029 Mon Dec 28 10:32:05 1992  Ken Raeburn  (raeburn@cygnus.com)
2030
2031         * app.c (app_push): Use memcpy, not bcopy.
2032         (do_scrub_next_char): For \", return " not '.
2033         (symbol_chars): Now const.
2034
2035         * expr.c (operand): If not LOCAL_LABELS_FB, don't look for "0f"
2036         and "0b".  If LOCAL_LABELS_DOLLAR, check for "0$".
2037
2038         * config/obj-coff.h: Don't use #elif.
2039
2040         * config/ho-sunos.h: Don't include sys/stdtypes.h; 4.0.3 doesn't
2041         have it.  (Reported by Noah Friedman, friedman@gnu.ai.mit.edu.)
2042
2043 Wed Dec 16 12:12:33 1992  Ian Lance Taylor  (ian@cygnus.com)
2044
2045         * write.c, obj-ieee.c: don't define SUB_SEGMENT_ALIGN if it is
2046         already defined.
2047
2048 Tue Dec 15 12:40:11 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2049
2050         * app.c (do_scrub_begin): allow single quote strings if so
2051         configured.
2052
2053         * config/*z8k*: checkpoint
2054
2055 Sun Dec 13 00:04:38 1992  Ian Lance Taylor  (ian@cygnus.com)
2056
2057         * read.c (read_a_source_file): avoid calling xmalloc (0).
2058
2059 Sat Dec 12 15:26:34 1992  Ian Lance Taylor  (ian@cygnus.com)
2060
2061         * listing.c: Call xmalloc, not malloc; don't declare malloc.
2062
2063         * Changes to support SCO 3.2v4:
2064         * read.c (s_align_bytes, s_align_ptwo): If not SEG_DATA or
2065         SEG_BSS, fill with NOP_OPCODE.
2066         * config/i386coff.mt: Add opcode/i386.h to TARG_CPU_DEPENDENTS.
2067         * config/obj-coffbfd.c (do_relocs_for): Increment addr even if not
2068         using ZERO_BASED_SEGMENTS.
2069         (fill_section): If ZERO_BASED_SEGMENTS, set segment addresses, but
2070         never set segment address for SEG_E2 (.bss) and don't write out
2071         SEG_E2 contents.  Set .init and .fini sections to STYP_TEXT.
2072         (obj_coff_endef): Don't merge labels or symbols awaiting forward
2073         definitions, and don't merge tags with non-tags.  Check for .bf
2074         rather than just checking whether the second character is b and
2075         the third character is f.
2076         (obj_coff_val): gcc can generate values which we don't handle
2077         correctly; discard information for now, since it only affects the
2078         debugging information.
2079         (tag_find_or_name): Don't insert tags in the symbol table.
2080         (yank_symbols): Don't merge labels.
2081         (write_object_file): Don't define SUB_SEGMENT_ALIGN if it is
2082         already defined.  Fill subsegments with NOP_OPCODE, not 0.  Don't
2083         set segment address if ZERO_BASED_SEGMENTS.
2084         (obj_coff_section): Accept and ignore a trailing quoted string, as
2085         used in AT&T i386 syntax.
2086         (fixup_segment): Take segment as argument.  On the i386, adjust PC
2087         relative addends by the segment vaddr.
2088         * tc-i386.h: Define SUB_SEGMENT_ALIGN.
2089         * tc-a29k.h: Define ZERO_BASED_SEGMENTS.
2090         * tc-i386.c: (i386_operand): If I386COFF, accept any segment type.
2091
2092 Tue Dec  8 00:06:48 1992  Ken Raeburn  (raeburn@rtl.cygnus.com)
2093
2094         * config/obj-coffbfd.c: Include libcoff.h.
2095
2096         * version.c: Now version 1.93.
2097
2098 Mon Dec  7 00:39:09 1992  Ken Raeburn  (raeburn@cygnus.com)
2099
2100         * config/tc-i386.c (md_pseudo_table): For 386bsd and linux, do
2101         power-of-two alignment for .align.
2102
2103         * as.h: If BROKEN_ASSERT, just redefine `assert' to be trivial,
2104         and leave everything else alone.
2105
2106 Fri Dec  4 16:58:42 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2107
2108         * Makefile.in (as.new): Don't bother saving as.old.
2109
2110         * write.c: Conditionalize on OBJ_VMS, not VMS.
2111         (magic_number_for_object_file): Don't define if OBJ_VMS.
2112
2113         * config/obj-vms.c: Changes for traditional C.
2114
2115 Thu Dec  3 01:24:07 1992  Ken Raeburn  (raeburn@kr-pc.cygnus.com)
2116
2117         * config/ho-generic.h (malloc, realloc): Declare.
2118
2119         * Lots of comment/whitespace changes.
2120
2121         * write.h (struct fix): Some fields reordered, narrowed.
2122
2123         * read.c (MASK_CHAR): Define using C types, not magic number.
2124
2125         * as.c, input-file.c: Deleted some unused code.
2126
2127         * app.c, as.h: Doc fix.
2128
2129         * flonum-konst.c, flonum-mult.c: Include ansidecl.h.
2130
2131         * as.h (xmalloc): Argument is long.
2132
2133         * xmalloc.c (error): Remove declaration; as.h takes care of it.
2134
2135         * doc/as.texinfo: Regrouped documentation of some command-line
2136         options.  Updated options documentation for m68k.  Some minor
2137         wording/punctuation changes.
2138
2139 Mon Nov 30 11:42:11 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2140
2141         * configure.in: Accept target OS "vms".
2142
2143         * symbols.c:  Merged ANSI and non-ANSI function decls, using
2144         PARAMS macro.
2145
2146         * xmalloc.c: Just include as.h, don't bother trying to figure out
2147         other header files.
2148
2149         * strstr.c, strerror.c: Deleted.
2150         * Makefile.in: Deleted references.
2151
2152         * config/tc-ns32k.c: Don't include header file for string
2153         declarations; leave that to ho-*.h.
2154
2155 Fri Nov 27 04:11:36 1992  Ken Raeburn  (raeburn at cambridge-laptop.cygnus.com)
2156
2157         * config/coff_gnu.h [TC_I860]: Guesses for reloc type values,
2158         imported from FSF sources.
2159
2160         * messages.c (strerror): Declare unconditionally.
2161
2162         * as.h: Delete alloca and register definitions.
2163
2164         * config/atof-ieee.c (mask): Now const.
2165
2166         * obstack.c, obstack.h: Deleted.
2167
2168         * as.h (flag_readonly_data_in_text): New flag.
2169         * as.c (main): Set it for -R.
2170
2171         * as.h (flag_suppress_warnings): New flag.
2172         * as.c (main): Set it for -W.
2173         * messages.c (as_warn): Check it instead of flagseen['W'].
2174
2175         * as.h (flag_always_generate_output): New flag.
2176         * as.c (main): Set it for -Z.
2177
2178         * config/tc-sparc.h: Define NEED_FX_R_TYPE.
2179         * config/tc-a29k.h: Ditto.
2180         * write.h (struct fix): Don't conditionalize fx_r_type field on TC
2181         macros.
2182
2183         * as.h: Merged ANSI and non-ANSI function decls, using PARAMS
2184         macro.
2185         * bignum.h, expr.h, flonum.h, frags.h, input-file.h, listing.h,
2186         obj.h, output-file.h, read.h, struc-symbol.h, symbols.h, tc.h,
2187         write.h: Likewise.
2188         * read.c: Likewise.
2189
2190         * xmalloc.c: Conditionalize on HAVE_MALLOC_H, not USG.  Fold in
2191         xrealloc from xrealloc.c.
2192         * xrealloc.c: Deleted.
2193         * Makefile.in (REAL_SOURCES, OBJS): Adjusted.
2194
2195         * configure.in: For host CPU a29k, rs6000, vax, consider using bsd
2196         or vms ho- files.
2197
2198         * config/ho-sysv.h (setbuffer, HO_USG): Deleted.
2199
2200         * config/atof-ieee.c (atof_ieee): Exponent field isn't a pointer;
2201         don't initialize it with NULL.
2202
2203         * config/ho-vax.h (M_VAX): Deleted; was unused.
2204
2205         * README-vms, config/ho-vms.h, config/obj-vms.c, config/obj-vms.h:
2206         New files imported from FSF version, contributed by Eric Youngdale.
2207         * README-vms-dbg, config/vms: Deleted.
2208
2209         * ChangeLog, config/ChangeLog: Merged.
2210
2211         * config/*tahoe*, configure.in: Tahoe support brought in from FSF
2212         version.
2213
2214         * input-file.c (input_file_open): Eliminate call to setvbuf.
2215         [USG] (setbuffer): Deleted macro.
2216
2217 Mon Nov 23 11:00:16 1992  Ken Raeburn  (raeburn@cygnus.com)
2218
2219         * all files: Whitespace changes for GNU indentation style, done by
2220         GNU `indent'.  Some cleanup still needed, especially of comments.
2221
2222         * configure.in: No te-386bsd.h file exists; don't try to use it.
2223
2224         * obj-coff.c (obj_coff_endef): Use as_warn, not fprintf.
2225
2226         * tc-m68k.c (md_assemble): Don't complain about 68000 with 68881;
2227         could be doing emulation.
2228
2229 Thu Nov 19 11:47:19 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2230     
2231         z8000 documentation
2232         * doc/Makefile.in, doc/all.m4, doc/as-all.texinfo, doc/as.texinfo:
2233         all modified.
2234
2235 Tue Nov 10 09:49:24 1992  Ian Lance Taylor  (ian@cygnus.com)
2236
2237         * Makefile.in (as.o, obj-format.o): added dependency on subsegs.h.
2238
2239         * subsegs.h: add extern to segment_info declaration.
2240
2241         * read.h: added extern declarations for comment_chars,
2242         line_comment_chars, and line_separator_chars.
2243         read.c, app.c: removed definitions of comment_chars,
2244         line_comment_chars, and line_separator_chars.
2245
2246         * tc-m68k.c (m68k_reg_parse): If REGISTER_PREFIX isn't defined,
2247         still accept (but don't require) OPTIONAL_REGISTER_PREFIX before
2248         the register name.
2249         (insert_reg): put REGISTER_PREFIX before register names before
2250         putting them in the symbol table.
2251         * tc-m68k.h (OPTIONAL_REGISTER_PREFIX): Define to be "%", if not
2252         M68KCOFF.
2253
2254         * obj-coffbfd.c (fill_section): set STYP_NOLOAD bit for .bss
2255         section.
2256
2257         * atof-ieee.c, atof-ns32k.c, tc-*.c: made EXP_CHARS, FLT_CHARS,
2258         comment_chars, line_comment_chars and line_seperator_chars
2259         consistently const, and always initialized them.  Included read.h.
2260
2261 Thu Nov  5 17:55:41 1992  Jim Wilson  (wilson@sphagnum.cygnus.com)
2262
2263         * tc-sparc.c (sparc_ip): Add code to flag error if an absolute
2264         constant will not fit in an immediate field.
2265         (md_apply_fix, RELOC_BASE13 case): Check for relocation overflow.
2266
2267 Wed Nov  4 07:50:46 1992  Ken Raeburn  (raeburn@cygnus.com)
2268
2269         * obj-coff.c (callj_table): Delete global variable.
2270         (obj_emit_relocations): Define it locally here, and only if
2271         TC_I960 is defined.
2272
2273         * tc-m68k.c (m68k_reg_parse): Underscore is part of a symbol name.
2274         (m68k_ip): Don't warn about bignum used as float bit-pattern.
2275
2276         * obj-coff.c: Replaced ANSI and non-ANSI function declarations
2277         with a single set using PARAMS macro.
2278
2279         * tc-i960.c (tc_bout_fix_to_chars): Bit-field fixups want a length
2280         of 2.
2281
2282         * tc-i960.c: Missed a couple of 0->NO_RELOC conversions.
2283
2284         * tc-i960.h (N_BALNAME, N_CALLNAME): Define as char-type values,
2285         so widening works consistently.
2286
2287 Wed Oct 28 08:52:34 1992  Ken Raeburn  (raeburn@cygnus.com)
2288
2289         * version.c: Put conditional "const" before version_string, not
2290         before dummy function for VMS.  Now version 1.91.03.
2291
2292         * app.c (do_scrub_next_char): Need double-\ before `000' to show
2293         printed rep of null character.
2294
2295 Fri Oct 23 14:40:38 1992  Ian Lance Taylor  (ian@cygnus.com)
2296
2297         * obj-coffbfd.c (write_object_file): check return value of
2298         bfd_close_all_done.
2299
2300 Tue Oct 20 12:18:08 1992  Ian Lance Taylor  (ian@cygnus.com)
2301
2302         * Support for i386-sysv.
2303         obj-coffbfd.c (do_relocs_for, write_object_file): set segment
2304         addresses to reasonable sizes.  New define ZERO_BASED_SEGMENTS can
2305         be used to set them all to zero as was done before.
2306         (fill_section): segment addresses now set in write_object_file.
2307         (fill_section): Don't set STYP_NOLOAD for .bss section.
2308         (fixup_segment): 386 uses strange common symbol format.
2309         tc-i386.c (tc_coff_fix2rtype): use R_DIR32, not R_RELLONG, for
2310         compatibility with SVR3.2 linker.
2311         * configure.in: i386-sysv and i386-sco use coffbfd.
2312
2313         * app.c (do_scrub_next_char): discard whitespace after a label.
2314
2315 Sat Oct 10 12:33:45 1992  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
2316
2317         * configure.in: differentiate between SunOS 4 and Solaris2 for Sun4
2318         hosts, use the sysv configuration for solaris2
2319
2320 Mon Oct  5 09:28:57 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2321
2322          fix i960+non-bfd coff bit rot. 
2323         * obj-coff.c (c_dot_file_symbol, obj_coff_ln, obj_coff_line):
2324         support for C source listings. (obj_coff_endef): look in the right
2325         part of the symbol for the symbol name
2326
2327         * tc-m68k.c (get_num): make it work for all segments, not just the
2328         first three.
2329
2330 Mon Oct  5 03:30:36 1992  Mark Eichin  (eichin at tweedledumber.cygnus.com)
2331
2332         * configure.in: recognize i386-*-bsd emulation.
2333
2334 Thu Oct  1 23:05:12 1992  david d `zoo' zuhn  (zoo at cirdan.cygnus.com)
2335
2336         * configure.in: use the cpu-vendor-os triple for host and target
2337
2338 Tue Sep 29 12:22:52 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2339
2340         * obj-coffbfd.c (write_object_file): don't fixup for the z8k
2341         * tc-z8k.c: lots of bug fixes
2342
2343 Tue Sep 29 10:51:55 1992  Ian Lance Taylor  (ian@cygnus.com)
2344
2345         * tc-i960.h, tc-i960.c: avoid the ANSI preprocessor addition
2346         #elif, since it is not supported by old compilers.
2347         ho-rs6000.h, tc-m68k.c: the native RS/6000 compiler miscompiles a
2348         couple of expressions in tc-m68k.c.
2349
2350 Mon Sep 28 21:18:24 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2351
2352         * read.c (cons): If NO_RELOC is defined, use it.
2353
2354         * tc-i960.c (get_cdisp): Use NO_RELOC, not 0, in call to fix_new.
2355
2356 Fri Sep 25 18:18:52 1992  Ian Lance Taylor  (ian@cygnus.com)
2357
2358         * tc-m68k.h: if M68KCOFF, define DOT_LABEL_PREFIX (to require
2359         local labels to start with a .) and set REGISTER_PREFIX to %.
2360         tc-m68k.c (m68k_reg_parse): accept REGISTER_PREFIX if defined.
2361
2362 Fri Sep 25 17:53:43 1992  John Gilmore  (gnu@cygnus.com)
2363
2364         * messages.c:  Comment changes.
2365
2366 Fri Sep 25 14:12:58 1992  Ken Raeburn  (raeburn@kyriath.cygnus.com)
2367
2368         * as.h: Test if __STDC__ is defined only, don't test its value.
2369         * messages.c: If __STDC__ is not defined, define NO_STDARG.
2370
2371 Thu Sep 24 12:42:32 1992  Brendan Kehoe  (brendan@rtl.cygnus.com)
2372
2373         * listing.c (debugging_pseudo): Add stabs and stabn as things to
2374         ignore.
2375
2376 Tue Sep 22 13:02:07 1992  Sean Eric Fagan  (sef@cygnus.com)
2377
2378         * obj-coffbfd.c (do_relocs_for,fill_section): now allocate all
2379         sections starting from zero, rather than making them consecutive.
2380         This makes subsequent reloc calculations easier, esp if the object
2381         format doesn't understand addends. (obj_coff_lcomm): (maybe temporarily)
2382         allocate lcomm in .data rather than in .bss.  It seems that some
2383         tools can't cope with a non-zero sized bss before linkage.
2384  
2385 Tue Sep 22 15:10:51 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2386
2387         * tc-m68k.c: Replace "enum m68k_architecture" with "int"
2388         throughout.  That enum no longer means what we thought it meant.
2389
2390         * tc-m68k.c (md_assemble, md_parse_option): Handle new
2391         "-mno-688[58]1" options.
2392
2393         * tc-m68k.c: Added CPU32 support.
2394
2395 Fri Sep 18 08:02:18 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2396
2397         * tc-m68k.c (m68k_ip): An(disp) is not pc relative.
2398
2399 Tue Sep 15 17:25:05 1992  Jim Wilson  (wilson@sphagnum.cygnus.com)
2400
2401         * Makefile.in (as.new): Remove dependence on LOCAL_LOADLIBES.
2402         Change LIBDEPS dependence to LIBS.
2403
2404 Tue Sep 15 15:32:02 1992  Ian Lance Taylor  (ian@cygnus.com)
2405
2406         * Makefile.in (install): if $(tooldir) exists, install as in
2407         $(tooldir)/bin.
2408
2409 Sun Sep 13 20:30:10 1992  Ian Lance Taylor  (ian@cygnus.com)
2410
2411         * Added WARN_SIGNED_OVERFLOW_WORD define to give an error if any
2412         .word is < -32768 or > 32767.  The -J flag causes the error to be
2413         ignored.  This is to catch over-sized switches generated by gcc on
2414         systems which don't support the broken .word hack.
2415         as.c (main): permit -J if WARN_SIGNED_OVERFLOW_WORD.
2416         write.c (fixup_segment): check for signed .word overflow if
2417         WARN_SIGNED_OVERFLOW_WORD.
2418
2419         * write.c (fixup_segment): fixed missing parens in expression
2420         checking for byte or word overflow.
2421
2422         * obj-coffbfd.h: define WARN_SIGNED_OVERFLOW_WORD.
2423         obj-coffbfd.c (fixup_segment): check for signed .word overflow if
2424         WARN_SIGNED_OVERFLOW_WORD.
2425
2426         * obj-coffbfd.c (fixup_segment): fixed missing parens in
2427         expression checking for byte or word overflow.
2428
2429 Fri Sep 11 10:21:04 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2430
2431         Support for i386 coff
2432         * obj-coffbfd.h : added stuff 
2433         * tc-i386.c (tc_coff_fix2rtype): new function
2434         * tc-i386.h : new coff defines
2435
2436 Thu Sep 10 09:23:15 1992  Ian Lance Taylor  (ian@cygnus.com)
2437
2438         * input-scrub.c (input_scrub_push): call input_file_begin, not
2439         input_scrub_begin.
2440         messages.c (as_perror): print ": " between the passed in error and
2441         the strerror, like perror does.
2442
2443 Wed Sep  9 11:06:25 1992  Ian Lance Taylor  (ian@cygnus.com)
2444
2445         * Makefile.in: use gas_target instead of modifying target_cpu.
2446         From Steve Chamberlain:
2447         Makefile.in: Handle m68*-*-coff*.
2448         read.c, read.h: add mult argument to s_space
2449
2450         * tc-m68k.c (m68k_ip, m68k_ip_op, get_num, try_moto_index): merge
2451          Motorola and MIT syntax; gas can now assemble either type of
2452          file.
2453         tc-m68kmote.c, tc-m68kmote.h: removed now superfluous files.
2454         From Steve Chamberlain:
2455         m68kcoff.mt: for m68k COFF.
2456         obj-coffbfd.c: (fixup_mdeps) added
2457          (size_section) removed bad sanity check
2458          (fill_section) added rs_machine_dependent case
2459          (write_object_file) call fixup_mdeps
2460          (fixup_segment) set fx_subsy to 0.
2461         obj-coffbfd.h: define WORKING_DOT_WORD (too hard to support) and
2462          handle m68k.
2463         tc-m68k.c, config/tc-m68k.h: added m68k COFF support and Motorala
2464          pseudo ops.
2465
2466 Tue Sep  8 17:10:58 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2467
2468         * Makefile.in (LIBS): Include opcode library.
2469
2470 Fri Sep  4 18:20:56 1992  Ken Raeburn  (raeburn@cygnus.com)
2471
2472         * config/tc-m68k.c (get_num, case SEG_BIG): If only small integers
2473         including zero are accepted, pass +0.0.
2474
2475 Sun Aug 30 21:24:46 1992  Ian Lance Taylor  (ian@cygnus.com)
2476
2477         * Makefile.in: map "as" through program_transform_name when
2478         installing.
2479
2480         * doc/Makefile.in: map "as" through program_transform_name when
2481         installing.
2482
2483 Sat Aug 29 12:11:12 1992  Jim Wilson  (wilson@sphagnum.cygnus.com)
2484
2485         * Makefile.in (as.new): Depend on LOCAL_LOADLIBES.
2486
2487 Fri Aug 28 16:25:22 1992  Ian Lance Taylor  (ian@cygnus.com)
2488
2489         * obj-bout.h, obj-bout.c (obj_header_append, obj_symbol_to_chars),
2490         tc-i960.c (md_ri_to_chars): Always output bout object file in
2491         little endian byte order (used to use endianness of host).
2492
2493 Tue Aug 25 15:50:48 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2494
2495         * config/tc-m68k.c (init_table): Now const.  Always include 68851
2496         data, so that "bc" is available to 68040 cache instructions.
2497         Added "tt0", "tt1", and 68ec030 variants.
2498         (md_assemble): Complain if 68000 (only) and 68881 are specified.
2499         (enum _register): Added TT0, TT1.
2500         (m68k_ip, cases '3' and 't'): Handle new operand type codes.  Pass
2501         line number correctly in "internal error" messages.  Don't print
2502         architecture-mismatch message for operand errors.
2503
2504         From Colin Smith (colin@wrs.com):
2505         * config/tc-m68k.c (m68k_ip, case '_'): Use addword twice rather
2506         than install_operand.
2507
2508 Tue Aug 25 15:13:48 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2509
2510         * listing.c (buffer_line): rewind to the start of include
2511         files, they might be included twice.
2512
2513         * z8k.c, z8k.h, z8k.mt: z8000 support stuff
2514
2515 Mon Aug 24 12:45:43 1992  Ian Lance Taylor  (ian@cygnus.com)
2516
2517         * Makefile.in: defined TARGET_CPU for C code so that it can choose
2518         one element of a family.
2519
2520         * tc-m68k.c: use TARGET_CPU to choose default cpu type.
2521
2522         * te-generic.h: default to LOCAL_LABELS_DOLLAR and LOCAL_LABELS_FB
2523         so that we can assemble hand-written libgcc code.
2524
2525 Fri Aug 21 14:38:44 1992  Ken Raeburn  (raeburn@cambridge.cygnus.com)
2526
2527         * messages.c (as_warn): Use fputs, not fprintf, with a buffer that
2528         has already been formatted (but may still contain %-characters).
2529         (as_bad): Likewise.
2530
2531 Wed Aug 19 11:20:59 1992  Ian Lance Taylor  (ian@cygnus.com)
2532
2533         * tc-m68k.c, tc-m68kmote.c: the cas2 instruction is supposed to be
2534         written with indirection on the last two operands, which can be
2535         either data or address registers.  Added a new operand type 'r'
2536         which accepts either register type.  Added '(' to notend stuff in
2537         tc-m68kmote.c to accept (a0):(a2) in cas2 instruction.
2538
2539 Wed Aug 19 09:25:09 1992  Ken Raeburn  (raeburn@cygnus.com)
2540
2541         * as.h (enum _relax_state): Start off at one, not zero, to better
2542         catch uninitialized-variable errors.
2543         (linkrelax): Declare new variable.
2544
2545         * messages.c (warning_count, error_count): Default initializer is
2546         sufficient.
2547
2548         * write.c: Merged some declarations, using PARMS macro.
2549         (text_frag_root, data_frag_root, bss_frag_root, text_last_frag,
2550         data_last_frag): No longer static.
2551         (write_object_file, case rs_align or rs_org): If HANDLE_ALIGN is
2552         defined, call it.  Change segments before calling fixup_segment.
2553         (relax_align): If linkrelax, provide extra padding.
2554
2555         * obj-bout.c (obj_emit_relocations): Emit alignment relocs despite
2556         their not having symbols associated.
2557
2558         * tc-i960.c (norelax, instrument_branches): Default initializer is
2559         sufficient.
2560         (linkrelax): Delete variable definition.
2561         (mem_fmt): Call fix_new with NO_RELOC.
2562         (tc_bout_fix_to_chars): Handle alignment relocs.
2563         (i960_handle_align): New function.
2564         * tc-i960.h (linkrelax): Delete declaration.
2565         (HANDLE_ALIGN): New macro; calls i960_handle_align.
2566         (NEED_FX_R_TYPE, NO_RELOC): New macros.
2567
2568 Tue Aug 18 14:59:21 1992  Ken Raeburn  (raeburn@cygnus.com)
2569
2570         * config/sparc.mt: New file.  Grab sparc opcode table from bfd
2571         library.
2572
2573 Tue Aug 18 14:16:38 1992  Ian Lance Taylor  (ian@cygnus.com)
2574
2575         * Makefile.in: always create installation directories.  Removed
2576         MINUS_G, set CFLAGS to default to -g, added FLAGS_TO_PASS, passed
2577         FLAGS_TO_PASS to recursive makes.
2578
2579         * doc/Makefile.in: always create installation directories.
2580
2581 Mon Aug 17 15:09:56 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2582
2583         * input-scrub.c (input_scrub_pop, input_scrub_push): memcpy was
2584         being used with args swapped, causing occasional lossage when
2585         refilling buffers after an include file.
2586
2587 Mon Aug 17 13:18:51 1992  Ken Raeburn  (raeburn@cygnus.com)
2588
2589         * messages.c (as_tsktsk): Use correct ANSI form for stdarg
2590         version.  Discard bogus DONTDEF version.
2591         (as_warn, as_bad, as_fatal): Likewise.
2592
2593 Fri Aug 14 18:31:14 1992  Ken Raeburn  (raeburn@cygnus.com)
2594
2595         * config/tc-m68k.c (m68k_ip): If instruction is invalid for the
2596         selected architecture, print a message saying so and listing what
2597         processors support it, rather than saying "operands mismatch".
2598
2599 Thu Aug 13 13:53:19 1992  Ken Raeburn  (raeburn@cygnus.com)
2600
2601         * as.h [BROKEN_ASSERT]: If defined, turn off all assertion checks.
2602
2603         * config/ho-rs6000.h (M_RS6000): Don't define it.
2604         (free): Declare it.
2605         (BROKEN_ASSERT): Define it if not __STDC__.
2606
2607 Tue Aug 11 12:58:14 1992  Ken Raeburn  (raeburn@cygnus.com)
2608
2609         * sparc.mt: New file.
2610
2611 Mon Aug 10 14:37:08 1992  Per Bothner  (bothner@cygnus.com)
2612
2613         * tc-m68k.c: ".align N" means align to N-byte boundary *only*
2614         if TN_SUN3; otherwise align to 2**N-byte bounary.
2615
2616 Thu Aug  6 12:10:39 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2617
2618         * read.c (s_fill): make the .fill size clamped error a warn and
2619         fix bug where 0's were always placed.
2620
2621         * config/tc-h8300.c: if a :8 is seen after an operand, fill top
2622         two bytes of any constant with 0xff:
2623
2624 Wed Aug  5 12:02:40 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2625
2626         * config/tc-m68k.c (md_pseudo_table): fix the .align thing
2627         the right way; for just the 68k. Sun 3 .align is nbytes, not ptwo.
2628
2629 Wed Aug  5 01:54:34 1992  John Gilmore  (gnu at cygnus.com)
2630
2631         * tc-m68k.c (try_index):  Error if index scaling specified and
2632         assembling for an older CPU than a 68020.
2633
2634 Sat Aug  1 19:10:13 1992  Ken Raeburn  (raeburn@cygnus.com)
2635
2636         * config/tc-sparc.c (tc_aout_fix_to_chars): If pc-relative, take
2637         fx_offset into account.
2638
2639 Fri Jul 31 21:53:28 1992  Ken Raeburn  (raeburn@cygnus.com)
2640
2641         * configure.in (mips host): Accept "ultrix" with version number.
2642
2643         * expr.c (floating_constant): Separate "=-" to avoid confusing
2644         ancient or broken compilers.
2645
2646         * config/tc-m68k.c (m68k_ip): Mismatch error could also indicate
2647         processor/opcode mismatch, so reword the error message.
2648         (md_assemble): If no CPU has been set (even if FPU/PMMU
2649         characteristics have been), default to 68020.  Don't need extra
2650         quotes around error string.
2651
2652 Fri Jul 31 12:26:34 1992  Jim Wilson  (wilson@sphagnum.cygnus.com)
2653
2654         * read.c (potable): Revert sac's incorrect change made Jul 13.
2655         Align really is supposed to be ptwo not nbytes.
2656
2657 Mon Jul 20 02:51:59 1992  D. V. Henkel-Wallace  (gumby@cygnus.com)
2658
2659         * Makefile.in: _Do_ include libiberty.  (from sef)
2660
2661 Fri Jul 17 15:15:28 1992  Ken Raeburn  (raeburn@cygnus.com)
2662
2663         * expr.c (integer_constant): Handle "0f" and "0b" label references
2664         properly.
2665
2666 Thu Jul 16 08:20:17 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2667
2668         * write.c (fixup_segment): if relaxing, don't do anything.
2669         * config/obj-bout.[ch] : maintain the a_relaxable file header info
2670         * config/tc-i960.c: new option -linkrelax
2671
2672 Mon Jul 13 14:11:36 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2673
2674         * expr.c (expr): allow SEG_BSS in expressions
2675         * read.c (potable): align should be nbytes, not ptwo!
2676         * write.c (write_object_file): extra glue for new bss attributes
2677         (relax_segment): SEG_BSS is ok now
2678         * config/tc-m68k.c (m68k_ip_op): can now parse more @( modes
2679
2680 Mon Jul  6 17:09:32 1992  Steve Chamberlain  (sac@cygnus.com)
2681
2682         * obj-coffbfd.c (fill_section): mark .lit sections as STYP_LIT
2683
2684 Mon Jun  1 16:20:22 1992  Michael Tiemann  (tiemann@cygnus.com)
2685
2686         * configure.in: recognize m680x0 as having sun3 emulation mode for
2687         vxworks environment.
2688
2689
2690 Tue Jun 30 20:25:54 1992  D. V. Henkel-Wallace  (gumby@cygnus.com)
2691
2692         * Makefile.in: Add program_suffix (parallel to program_prefix)
2693
2694 Wed Jun 24 10:57:54 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2695
2696         * app.c (process_escape): new function to handle escapes the right
2697         way, (do_scrub_next_char): use new function
2698         * cond.c (s_ifdef): do ifdef/ifndef right
2699         * read.c (s_fill): make the , expressions optional like the doc
2700         says
2701         * config/tc-h8300.[ch]: better warnings
2702
2703 Tue Jun  9 07:54:54 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2704
2705         * subsegs.c (subsegs_begin): create bss0_frchainP in the same was
2706         as data0_frchainP
2707
2708         * write.c (write_object_file): various changes to handle data in
2709         the BSS segment in much the same was as stuff in the DATA segment. 
2710
2711         * tc-m68k.c (m68kip): Fix typo so that only arch's >=68020 do
2712         pcrel data stuff. (md_estimate_size_before_relax): when relaxing a
2713         68010 bxx into a bra+6 jmpxx, put the bytes of the jmp opcode into
2714         the right place. (s_bss): Don't put .bss stuff into SEG_DATA, put
2715         it into SEG_BSS
2716
2717 Thu Jun  4 11:59:13 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2718
2719         * expr.c(expr): allow SEG_REGISTER in expressions.
2720         * read.c(pseudo_set): register expressions can be the source of a
2721         set.
2722         * subsegs.c (subseg_new): Now -R forces all changes to SEG_DATA to
2723         goto SEG_TEXT (if a.out)
2724         * write.c (write_object_file): If a.out don't use the old way for
2725         -R.
2726         * config/obj-a.out (s_sect): complain if the user tries to use a
2727         subsegment with a value which might interfere with out -R hackery.
2728         * config/tc-m68k.c (m68k_reg_parse): lookup names in symbol table
2729         rather than use ugly if tree. (init_regtable): insert register
2730         names into symbol table.
2731
2732 Tue Jun  2 16:47:09 1992  Steve Chamberlain (sac@cygnus.com)
2733
2734         * write.c (write_object_file): keep the fix_tail clean, which
2735         fixes a bug in -R where relocations were being lost.
2736
2737 Mon Jun  1 16:20:22 1992  Michael Tiemann  (tiemann@cygnus.com)
2738
2739         * configure.in: recognize m680x0 as having sun3 emulation mode for
2740         vxworks environment.
2741
2742 Sun May 31 05:33:00 1992  david d `zoo' zuhn (zoo@cygnus.com)
2743
2744         * configure.in: recognize m680x0 as an m68k
2745
2746 Thu May 28 11:22:02 1992  Jim Wilson  (wilson@sphagnum.cygnus.com)
2747
2748         * configure.in: Recognize sparclite as a sparc variant.
2749
2750         * tc-sparc.c: Use new ARCHITECTURES_CONFLICT_P macro.  Mention new
2751         -Asparclite flag.
2752
2753 Tue May 26 16:47:56 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2754
2755         * config/tc-a29k.c: lint
2756         * listing.c, expr.c: patches from Andrew Smith
2757
2758 Thu May 14 17:22:48 1992  K. Richard Pixley  (rich@rtl.cygnus.com)
2759
2760         * doc/Makefile.in: use m4 rather than gm4.
2761
2762 Mon May  4 18:56:19 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2763
2764         * obj-coffbfd.c: use is a synonym for section, (do_relocs_for):
2765         calc the base of relocs correctly.
2766         * tc-a29k.c (parse_operand): allow expressions to be in any section.
2767
2768 Mon Apr 27 13:13:31 1992  K. Richard Pixley  (rich@cygnus.com)
2769
2770         * as.c, write.c: use -K rather than -k for the broken word warning
2771           option.
2772
2773 Tue Apr 21 13:35:30 1992  K. Richard Pixley  (rich@cygnus.com)
2774
2775         * Makefile.in: do not print recursion lines.
2776
2777 Wed Apr 15 21:19:31 1992  K. Richard Pixley  (rich@rtl.cygnus.com)
2778
2779         * Makefile.in: the tooldir copy of gas goes directly in tooldir.
2780
2781 Tue Apr 14 14:50:22 1992  Ken Raeburn  (Raeburn@Cygnus.COM)
2782
2783         * write.c (write_object_file): For b.out format, round up section
2784         start addresses to match required alignment.
2785
2786 Thu Apr  9 05:45:29 1992  Ken Raeburn  (Raeburn@Cygnus.COM)
2787
2788         * Makefile.in (install): Install into $(tooldir)/bin, since that's
2789         where gcc looks for it.
2790
2791 Tue Apr  7 15:12:15 1992  Sean Eric Fagan  (sef@cygnus.com)
2792
2793         * Makefile.in:  Changed some lines to be less confusing for some
2794         makes.
2795
2796         * input-file.c:  Conditionalize on _IOFBF, not VMS.
2797
2798         * read.c, write.c:  Change a series of ifdef/elif to
2799         ifdef/else/ifdef etc.
2800
2801 Fri Mar 27 12:21:16 1992  K. Richard Pixley  (rich@cygnus.com)
2802
2803         * symbols.c (fb_label_init): fix sizeof to memset.
2804
2805 Fri Mar 13 15:45:44 1992  K. Richard Pixley  (rich@cygnus.com)
2806
2807         * Makefile.in: install the man page.
2808
2809         * Makefile.in: pass down MAKEINFO explicitly on info.
2810
2811         * doc/Makefile.in: use $(MAKEINFO) not makeinfo.
2812
2813 Fri Mar 13 08:03:03 1992  Steve Chamberlain  (sac@thepub.cygnus.com)
2814
2815         * flonum-const.c: renamed flonum-konst.c to stop dos name
2816         conflict.
2817
2818 Thu Mar 12 04:42:38 1992  K. Richard Pixley  (rich@cygnus.com)
2819
2820         * tc-m68k.h, te-sun3.h: moved LOCAL_LABELS_FB definition from
2821           tc-m68k.h to te-sun3.h. 
2822
2823 Wed Mar 11 23:32:42 1992  K. Richard Pixley  (rich@cygnus.com)
2824
2825         * configure.in: vxworks68 gets te-sun3.h.
2826
2827         * expr.c: remove limitation that local_labels_dollar or
2828           local_labels_fb must be < 10.
2829
2830         * symbols.c: remove local_labels_dollar, replace with a function
2831           interface for a sparse array.  All users adjusted.
2832
2833         * te-sun3.h: add LOCAL_LABELS_DOLLAR.
2834
2835 Sat Mar  7 00:06:25 1992  K. Richard Pixley  (rich@rtl.cygnus.com)
2836
2837         * doc/Makefile.in: commented out line for building as-all.texinfo.
2838           This is temporary.
2839
2840         * doc/as.texinfo, doc/as-all.texinfo: added menu item hooks.
2841
2842 Fri Mar  6 21:57:18 1992  K. Richard Pixley  (rich@cygnus.com)
2843
2844         * Makefile.in: added check target.
2845
2846 Tue Mar  3 15:45:56 1992  K. Richard Pixley  (rich@rtl.cygnus.com)
2847
2848         * Makefile.in: added tooldir and program_prefix.
2849
2850 Sun Mar  1 04:43:19 1992  Michael Tiemann  (tiemann@cygnus.com)
2851
2852         * write.{c,h} (fix_new): Make these declarations consistent.
2853
2854 Sat Feb 29 13:59:10 1992  Michael Tiemann  (tiemann@cygnus.com)
2855
2856         * Makefile.in (strerror.o): Add rule so that broken Sun make can
2857         work in subdirs.
2858
2859 Wed Feb 26 19:26:28 1992  Steve Chamberlain  (sac at thepub.cygnus.com)
2860
2861         * read.c, obj-coffbfd.c : fix h8300 specific bit rot
2862
2863         * expr.c (operand): if can't work out what sort of operand it is,
2864         then look through FLT_CHARS for a hint.
2865
2866 Wed Feb 26 18:04:40 1992  K. Richard Pixley  (rich@cygnus.com)
2867
2868         * Makefile.in, configure.in: removed traces of namesubdir,
2869           -subdirs, $(subdir), $(unsubdir), some rcs triggers.  Forced
2870           copyrights to '92, changed some from Cygnus to FSF.
2871
2872         * doc/Makefile.in, doc/configure.in: removed traces of namesubdir,
2873           -subdirs, $(subdir), $(unsubdir), some rcs triggers.  Forced
2874           copyrights to '92, changed some from Cygnus to FSF.
2875
2876 Tue Feb 25 14:17:15 1992  Steve Chamberlain  (sac at rtl.cygnus.com)
2877
2878         * expr.c: If an expression is single comma, then return with
2879         SEG_ABSENT rather than an error - since the sparc front end does
2880         really strange things with things like fbge,a 
2881
2882         * as.h: include bfd.h if using many sections
2883         * expr.c: LOCAL_LABELS_FB had been changed to lower case - so
2884         local labels didn't work.
2885         * listing.c (list_symbol_table): don't core dump when there's no
2886         symbol there.
2887         * write.c, write.h: call fix_new with the right number of args on
2888         the H8.
2889         * config/tc-h8300.[ch] : fix bugs reported by HMSI, and make
2890         errors nices
2891
2892 Sat Feb 22 12:26:28 1992  Steve Chamberlain  (sac at rtl.cygnus.com)
2893
2894         * app.c: MRI compatibility - allow single quote to start a string.
2895         * as.c: fix typo recently introduced.
2896         * as.h : Don't include aout/reloc.h - it's not right for COFF!
2897         * expr.c: Much rewriting, to accomodate MRI syntax for
2898         expressions. Also easier to read now.
2899         * listing.c: Put back defuns
2900         * read.c: modified to accept MRI syntax, put back listing pseudo
2901         ops so that an assembler built with NO_LISTING ignores list ops
2902         rather than pukes.
2903         * write.c, write.h: fixs - only keep a reloc type in a fix if the target
2904         machine is a SPARC or a 29K.
2905         * config/obj-aout.c: added s_sect pseudo op
2906         * config/obj-coffbfd.c: lints, set the filehdr flags right and
2907         fill in the timestamp.
2908         * config/obj-coffbfd.h: Since we don't include aout/reloc.h
2909         anymore, define all the relocs which the tc-<x> bit will use so we
2910         can translate from them to the coff types.
2911         * config/tc-a29k.c: reloc_type isn't ane enum any more
2912         * config/tc-m68k.c: Added NO_RELOC definition.
2913
2914 Fri Feb 21 06:21:07 1992  K. Richard Pixley  (rich@rtl.cygnus.com)
2915
2916         * Makefile.in: put header files before C source for TAGS; remove
2917           references to non-existent syscalls.h.
2918
2919         * read.c, write.c subsegs.c: back out the .bss changes.
2920
2921         * obj-aout.c: do not include stab.gnu.h if NO_LISTING.
2922
2923         * tc-i860.c, a.out.gnu.h: move i860 relocs to a proper place.
2924
2925         * a.out.h: removed.
2926
2927 Fri Feb 21 01:08:48 1992  Minh Tran-Le (TRANLE@INTELLICORP.COM)
2928
2929         * symbols.c (local_label_name): symbols now start with ^A.
2930
2931         * read.c, subsegs.c, write.c obj-coff.c: added handling of
2932           `.bss` pseudo op for unitialized data. The new gcc (1.37.9x)
2933           generate these sections.  .align: will use NOP_OPCODE or 0
2934           for padding. This is just for being nice to the
2935           disassembler.
2936
2937         * expr.c (operand): changed to generate local label "\001L0"
2938           starting with a ^A so that it is recognized as a local label.
2939
2940         * as.c (perform_an_assembly_pass): zero bss_fix_root, too.
2941
2942         * tc-i386.c: tc-i386.c: added handling of the following opcodes:
2943           i/o opcodes - inb, inw, outb and outw.  string manipulation with
2944           att syntax - scmp, slod, smov, ssca, ssto.
2945
2946         * obj-coff.c: (for aix386) Moved the symbols .text, .data and .bss
2947           to just after .file .
2948
2949           In obj_crawl_symbol_chain() where it tries to put the external
2950           symbols apart, with the condition:
2951             (!S_IS_DEFINED(symbolP) &&
2952              !S_IS_DEBUG(symbolP) &&
2953              !SF_GET_STATICS(symbolP))
2954           it was moving too many symbols out. So I switch it back to the
2955           condition:
2956             (S_GET_STORAGE_CLASS(symbolP) == C_EXT && !SF_GET_FUNCTION(symbolP))
2957
2958           In obj_emit_relocations() added the conditional on KEEP_RELOC_INFO
2959           so that we don't use the F_RELFLG which make the linker complain
2960           that somebody has stripped the relocation info.
2961
2962           Also, the AIX ld program require that the relocation table
2963           is sorted by r_vaddr like the standard ATT assembler does.
2964
2965           [he also changed the sizeof(struct ...)'s into the coff
2966           style FOOSZ macros.  I'm not sure this is right, but I can't
2967           remember why.  xoxorich.]
2968
2969 Fri Feb 21 01:08:48 1992  K. Richard Pixley  (rich@cygnus.com)
2970
2971         * Makefile.in, configure.in, doc: use the doc.  Build it, install
2972           it, clean it, etc.
2973
2974 Tue Feb 18 02:21:25 1992  K. Richard Pixley  (rich at cygnus.com)
2975
2976         * read.c: white space and comments only.
2977
2978         * configure.in: use the new atof-ns32.c for ns32k.
2979
2980         * write.c: comment change only.
2981
2982         * tc-m88k.[hc]: pulled in from hack's unfinished work.  These
2983           aren't yet integrated.
2984
2985         * tc-i860.[hc]: blew off the dust.  Something must still be done
2986           about conflicting relocation types.
2987
2988         * tc-ns32k.c: Replaced previous tc_aout_fix_to_chars stub with the
2989           real thing.
2990
2991         * tc-i960.c, tc-sparc.c: white space and comments only.
2992
2993         * tc-a29k.h: delete duplicate macro definition.
2994
2995         * new file atof-ns32k.c copied from hack's last unreleased gas.
2996
2997 Mon Feb 17 07:51:06 1992  K. Richard Pixley  (rich at cygnus.com)
2998
2999         * config/tc-ns32k.c: actually make tc_aout_fix_to_chars work
3000           rather than abort.
3001                                        
3002         * nearly everything.  flush ChangeLog, package as gas-1.92.1.
3003           ChangeLog's prior to this are sketchy at best.  I have logs.
3004           They just aren't ChangeLogs.