]> git.ipfire.org Git - thirdparty/binutils-gdb.git/commitdiff
* config/tc-a29k.h: Fix comment typos.
authorKazu Hirata <kazu@codesourcery.com>
Sat, 22 Nov 2003 02:35:31 +0000 (02:35 +0000)
committerKazu Hirata <kazu@codesourcery.com>
Sat, 22 Nov 2003 02:35:31 +0000 (02:35 +0000)
* config/tc-arm.c: Likewise.
* config/tc-dlx.h: Likewise.
* config/tc-hppa.c: Likewise.
* config/tc-i386.c: Likewise.
* config/tc-m32r.c: Likewise.
* config/tc-m68hc11.c: Likewise.
* config/tc-m68k.c: Likewise.
* config/tc-m88k.c: Likewise.
* config/tc-mcore.c: Likewise.
* config/tc-mips.c: Likewise.
* config/tc-mmix.c: Likewise.
* config/tc-msp430.c: Likewise.
* config/tc-ns32k.c: Likewise.
* config/tc-or32.c: Likewise.
* config/tc-or32.h: Likewise.
* config/tc-pj.c: Likewise.
* config/tc-ppc.c: Likewise.
* config/tc-s390.c: Likewise.
* config/tc-sh64.c: Likewise.
* config/tc-sh.c: Likewise.
* config/tc-sparc.c: Likewise.

22 files changed:
gas/config/tc-a29k.h
gas/config/tc-arm.c
gas/config/tc-dlx.h
gas/config/tc-hppa.c
gas/config/tc-i386.c
gas/config/tc-m32r.c
gas/config/tc-m68hc11.c
gas/config/tc-m68k.c
gas/config/tc-m88k.c
gas/config/tc-mcore.c
gas/config/tc-mips.c
gas/config/tc-mmix.c
gas/config/tc-msp430.c
gas/config/tc-ns32k.c
gas/config/tc-or32.c
gas/config/tc-or32.h
gas/config/tc-pj.c
gas/config/tc-ppc.c
gas/config/tc-s390.c
gas/config/tc-sh.c
gas/config/tc-sh64.c
gas/config/tc-sparc.c

index dfa62516e09263aa402096cc13901739e4104ae8..7f3f1b2425f63b2a4613156ff06d99a239f05cac 100644 (file)
@@ -41,7 +41,7 @@ extern int a29k_unrecognized_line PARAMS ((int));
 #define COFF_MAGIC SIPFBOMAGIC
 /* Should the reloc be output ?
        on the 29k, this is true only if there is a symbol attached.
-       on the h8, this is allways true, since no fixup is done
+       on the h8, this is always true, since no fixup is done
 */
 #define TC_COUNT_RELOC(x) (x->fx_addsy)
 #define TC_CONS_RELOC RELOC_32
index 025dd1662ac6f1fa1eff3d199712bf70def1a132..a684350462a23559c8b54784d7e4b227c8390ade 100644 (file)
@@ -1180,7 +1180,7 @@ static const struct asm_opcode insns[] =
   {"mla",        0xe0200090, 3,  ARM_EXT_V2,       do_mla},
   {"mlas",       0xe0300090, 3,  ARM_EXT_V2,       do_mla},
 
-  /* Generic copressor instructions.  */
+  /* Generic coprocessor instructions.  */
   {"cdp",        0xee000000, 3,  ARM_EXT_V2,       do_cdp},
   {"ldc",        0xec100000, 3,  ARM_EXT_V2,       do_lstc},
   {"ldcl",       0xec500000, 3,  ARM_EXT_V2,       do_lstc},
@@ -2867,7 +2867,7 @@ s_unreq (int a ATTRIBUTE_UNUSED)
              if (!req_entry)
                as_bad (_("unreq: missing hash entry for \"%s\""), name);
              else if (req_entry->builtin)
-               /* FIXME: We are deleteing a built in register alias which
+               /* FIXME: We are deleting a built in register alias which
                   points to a const data structure, so we only need to
                   free up the memory used by the key in the hash table.
                   Unfortunately we have not recorded this value, so this
@@ -2876,7 +2876,7 @@ s_unreq (int a ATTRIBUTE_UNUSED)
                ;
              else
                {
-                 /* Deleteing a user defined alias.  We need to free the
+                 /* Deleting a user defined alias.  We need to free the
                     key and the value, but fortunately the key is the same
                     as the value->name field.  */
                  free ((char *) req_entry->name);
index c069d11763e114d0896c439dccf4948a8532c09d..9aab0d2d4f10561a7a48795b276e39f0aa62a806 100644 (file)
@@ -64,7 +64,7 @@ extern int dlx_unrecognized_line PARAMS ((int));
 #define COFF_MAGIC DLXMAGIC
 /* Should the reloc be output ?
        on the 29k, this is true only if there is a symbol attached.
-       on the h8, this is allways true, since no fixup is done
+       on the h8, this is always true, since no fixup is done
         on dlx, I have no idea!! but lets keep it here just for fun.
 */
 #define TC_COUNT_RELOC(x) (x->fx_addsy)
index f537770e5fc47a47adc7fb36d33b20261c784156..7fbcd0a6e04b05bddeb355680dc1f31ef8ab8fbe 100644 (file)
@@ -596,7 +596,7 @@ static void pa_vtable_entry PARAMS ((int));
 static void pa_vtable_inherit  PARAMS ((int));
 #endif
 
-/* File and gloally scoped variable declarations.  */
+/* File and globally scoped variable declarations.  */
 
 #ifdef OBJ_SOM
 /* Root and final entry in the space chain.  */
index 66b30662c9db4f504ac7b8044aad22057b93f5dd..b1ba9585af1eea71b5cede7b42b299abe81ee530 100644 (file)
@@ -1379,7 +1379,7 @@ md_assemble (line)
 
       if ((i.tm.cpu_flags & CpuPNI) && i.operands > 0)
        {
-         /* These Intel Precott New Instructions have the fixed
+         /* These Intel Prescott New Instructions have the fixed
             operands with an opcode suffix which is coded in the same
             place as an 8-bit immediate field would be. Here we check
             those operands and remove them afterwards.  */
index f601504f8af737c4a6990d28e44c00188c84e5ea..dc640c4bf97df11da0d2d82ecc64b62154452aac 100644 (file)
@@ -762,7 +762,7 @@ assemble_two_insns (str, str2, parallel_p)
   char *errmsg;
   char save_str2 = *str2;
 
-  /* Seperate the two instructions.  */
+  /* Separate the two instructions.  */
   *str2 = 0;
 
   /* Make sure the two insns begin on a 32 bit boundary.
@@ -1017,14 +1017,14 @@ md_assemble (str)
   /* Initialize GAS's cgen interface for a new instruction.  */
   gas_cgen_init_parse ();
 
-  /* Look for a parallel instruction seperator.  */
+  /* Look for a parallel instruction separator.  */
   if ((str2 = strstr (str, "||")) != NULL)
     {
       assemble_two_insns (str, str2, 1);
       return;
     }
 
-  /* Also look for a sequential instruction seperator.  */
+  /* Also look for a sequential instruction separator.  */
   if ((str2 = strstr (str, "->")) != NULL)
     {
       assemble_two_insns (str, str2, 0);
index c6a4dd5acb5c37497c164b372ca19f8167147647..812cda541d9e749a48bdf9f86dea0788828d12f6 100644 (file)
@@ -233,7 +233,7 @@ static short flag_print_opcodes = 0;
 static struct hash_control *m68hc11_hash;
 
 /* Current cpu (either cpu6811 or cpu6812).  This is determined automagically
-   by 'get_default_target' by looking at default BFD vector.  This is overriden
+   by 'get_default_target' by looking at default BFD vector.  This is overridden
    with the -m<cpu> option.  */
 static int current_architecture = 0;
 
@@ -1569,7 +1569,7 @@ build_jump_insn (struct m68hc11_opcode *opcode, operand operands[],
   fragS *frag;
   int where;
 
-  /* The relative branch convertion is not supported for
+  /* The relative branch conversion is not supported for
      brclr and brset.  */
   assert ((opcode->format & M6811_OP_BITMASK) == 0);
   assert (nb_operands == 1);
@@ -1719,7 +1719,7 @@ build_dbranch_insn (struct m68hc11_opcode *opcode, operand operands[],
   char *f;
   unsigned long n;
 
-  /* The relative branch convertion is not supported for
+  /* The relative branch conversion is not supported for
      brclr and brset.  */
   assert ((opcode->format & M6811_OP_BITMASK) == 0);
   assert (nb_operands == 2);
@@ -2058,7 +2058,7 @@ build_reg_mode (operand *op, int format)
 }
 
 /* build_insn takes a pointer to the opcode entry in the opcode table,
-   the array of operand expressions and builds the correspding instruction.
+   the array of operand expressions and builds the corresponding instruction.
    This operation only deals with non relative jumps insn (need special
    handling).  */
 static void
index 5d53fa8515ab52a2643d01b03cf4a35183cbe455..09a8396c8d2a91f9af886465b8b4728379b9b32b 100644 (file)
@@ -672,7 +672,7 @@ make_pcrel_absolute(fixP, add_number)
   register unsigned char *opcode = fixP->fx_frag->fr_opcode;
 
   /* Rewrite the PC relative instructions to absolute address ones.
-     these are rumoured to be faster, and the apollo linker refuses
+     these are rumored to be faster, and the apollo linker refuses
      to deal with the PC relative relocations.  */
   if (opcode[0] == 0x60 && opcode[1] == 0xff) /* BRA -> JMP.  */
     {
@@ -2400,7 +2400,7 @@ m68k_ip (instring)
                  break;
                }
 
-             /* Figure out innner displacement stuff.  */
+             /* Figure out inner displacement stuff.  */
              if (opP->mode == POST || opP->mode == PRE)
                {
                  if (cpu_of_arch (current_architecture) & cpu32)
@@ -4583,7 +4583,7 @@ md_convert_frag_1 (fragP)
       fragP->fr_opcode[1]  = 0x06;     /* Branch offset = 6.  */
 
       /* JF: these used to be fr_opcode[2,3], but they may be in a
-          different frag, in which case refering to them is a no-no.
+          different frag, in which case referring to them is a no-no.
           Only fr_opcode[0,1] are guaranteed to work.  */
       *buffer_address++ = 0x4e;        /* put in jmp long (0x4ef9) */
       *buffer_address++ = (char) 0xf9;
@@ -5443,7 +5443,7 @@ s_opt (ignore)
 }
 
 /* Skip ahead to a comma.  This is used for OPT options which we do
-   not suppor tand which take arguments.  */
+   not supporand which take arguments.  */
 
 static void
 skip_to_comma (arg, on)
index 2cb4fa491c7152b3ebe6c31e931810912dc7d0a1..ec4acc88c3e9de815697479de5cb605e7ba8b60f 100644 (file)
@@ -1062,7 +1062,7 @@ md_estimate_size_before_relax (fragP, segment_type)
 
 /* These functions are needed if we are linking with obj-coffbfd.c.
    That file may be replaced by a more BFD oriented version at some
-   point.  If that happens, these functions should be rexamined.
+   point.  If that happens, these functions should be reexamined.
 
    Ian Lance Taylor, Cygnus Support, 13 July 1993.  */
 
index fe3317059b441cfbbc154178fc9778ba8c04ac88..c10b75d226c76f9aaed71dbe32e4c1b4dc85e6cf 100644 (file)
@@ -346,7 +346,7 @@ mcore_s_section (ignore)
 {
   /* Scan forwards to find the name of the section.  If the section
      being switched to is ".line" then this is a DWARF1 debug section
-     which is arbitarily placed inside generated code.  In this case
+     which is arbitrarily placed inside generated code.  In this case
      do not dump the literal pool because it is a) inefficient and
      b) would require the generation of extra code to jump around the
      pool.  */
index 75f81074dbbd35954f93e4a631497fb805fb9f79..1afd8bf68e69a32f08a5310987e9a0e4287db7da 100644 (file)
@@ -468,7 +468,7 @@ static int auto_align = 1;
    variable.  */
 static offsetT mips_cprestore_offset = -1;
 
-/* Similiar for NewABI PIC code, where $gp is callee-saved.  NewABI has some
+/* Similar for NewABI PIC code, where $gp is callee-saved.  NewABI has some
    more optimizations, it can use a register value instead of a memory-saved
    offset and even an other register than $gp as global pointer.  */
 static offsetT mips_cpreturn_offset = -1;
@@ -1708,8 +1708,8 @@ append_insn (char *place, struct mips_cl_insn *ip, expressionS *address_expr,
          /* The previous instruction reads the LO register; if the
             current instruction writes to the LO register, we must
             insert two NOPS.  Some newer processors have interlocks.
-            Also the tx39's multiply instructions can be exectuted
-             immediatly after a read from HI/LO (without the delay),
+            Also the tx39's multiply instructions can be executed
+             immediately after a read from HI/LO (without the delay),
              though the tx39's divide insns still do require the
             delay.  */
          if (! (hilo_interlocks
@@ -2288,7 +2288,7 @@ append_insn (char *place, struct mips_cl_insn *ip, expressionS *address_expr,
                  && ISA_HAS_COPROC_DELAYS (mips_opts.isa)
                  && (pinfo & INSN_READ_COND_CODE))
              /* We can not swap with an instruction that requires a
-                delay slot, becase the target of the branch might
+                delay slot, because the target of the branch might
                 interfere with that instruction.  */
              || (! mips_opts.mips16
                  && ISA_HAS_COPROC_DELAYS (mips_opts.isa)
@@ -3277,7 +3277,7 @@ macro_build_ldst_constoffset (char *place, int *counter, expressionS *ep,
                          - 0x80000000);
     }
 
-  /* Right now, this routine can only handle signed 32-bit contants.  */
+  /* Right now, this routine can only handle signed 32-bit constants.  */
   if (! IS_SEXT_32BIT_NUM(ep->X_add_number + 0x8000))
     as_warn (_("operand overflow"));
 
@@ -3427,7 +3427,7 @@ check_absolute_expr (struct mips_cl_insn *ip, expressionS *ex)
            : 0)
 
 /*                     load_register()
- *  This routine generates the least number of instructions neccessary to load
+ *  This routine generates the least number of instructions necessary to load
  *  an absolute expression value into a register.
  */
 static void
@@ -3980,11 +3980,11 @@ move_register (int *counter, int dest, int source)
  *   This routine implements the seemingly endless macro or synthesized
  * instructions and addressing modes in the mips assembly language. Many
  * of these macros are simple and are similar to each other. These could
- * probably be handled by some kind of table or grammer aproach instead of
+ * probably be handled by some kind of table or grammar approach instead of
  * this verbose method. Others are not simple macros but are more like
  * optimizing code generation.
  *   One interesting optimization is when several store macros appear
- * consecutivly that would load AT with the upper half of the same address.
+ * consecutively that would load AT with the upper half of the same address.
  * The ensuing load upper instructions are ommited. This implies some kind
  * of global optimization. We currently only optimize within a single macro.
  *   For many of the load and store macros if the address is specified as a
@@ -4028,7 +4028,7 @@ macro (struct mips_cl_insn *ip)
   expr1.X_add_symbol = NULL;
   expr1.X_add_number = 1;
 
-  /* Umatched fixups should not be put in the same frag as a relaxable
+  /* Unmatched fixups should not be put in the same frag as a relaxable
      macro.  For example, suppose we have:
 
        lui $4,%hi(l1)          # 1
@@ -6096,7 +6096,7 @@ macro (struct mips_cl_insn *ip)
             files with -mabi=64, assembling them as o32 or n32 (with
             -Wa,-32 or -Wa,-n32).  This is not beautiful, but since
             the whole kernel is loaded into a memory region that is
-            addressible with sign-extended 32-bit addresses, it is
+            addressable with sign-extended 32-bit addresses, it is
             wasteful to compute the upper 32 bits of every
             non-literal address, that takes more space and time.
             Some day this should probably be implemented as an
@@ -11796,7 +11796,7 @@ s_align (int x ATTRIBUTE_UNUSED)
 
   /*
 
-    o  Note that the assembler pulls down any immediately preceeding label
+    o  Note that the assembler pulls down any immediately preceding label
        to the aligned address.
     o  It's not documented but auto alignment is reinstated by
        a .align pseudo instruction.
@@ -12551,7 +12551,7 @@ s_cprestore (int ignore ATTRIBUTE_UNUSED)
 }
 
 /* Handle the .cpreturn pseudo-op defined for NewABI PIC code. If an offset
-   was given in the preceeding .cpsetup, it results in:
+   was given in the preceding .cpsetup, it results in:
      ld                $gp, offset($sp)
 
    If a register $reg2 was given there, it results in:
index 1e01b7a3abc329b70f6435cc7a0bdf138f256189..dddc20a622bce98d5a8bb748326a3aa3104568be 100644 (file)
@@ -275,7 +275,7 @@ struct obstack mmix_sym_obstack;
 #define STATE_GREG_UNDF ENCODE_RELAX (STATE_GREG, STATE_ZERO)
 #define STATE_GREG_DEF ENCODE_RELAX (STATE_GREG, STATE_MAX)
 
-/* These displacements are relative to the adress following the opcode
+/* These displacements are relative to the address following the opcode
    word of the instruction.  The catch-all states have zero for "reach"
    and "next" entries.  */
 
@@ -1464,7 +1464,7 @@ md_assemble (str)
       break;
 
     case mmix_operands_jmp:
-      /* A JMP.  Everyhing is already done.  */
+      /* A JMP.  Everything is already done.  */
       break;
 
     case mmix_operands_roundregs:
@@ -1839,7 +1839,7 @@ md_assemble (str)
            {
              /* Don't require non-register operands.  Always generate
                 fixups, so we don't have to copy lots of code and create
-                maintanance problems.  TRIP is supposed to be a rare
+                maintenance problems.  TRIP is supposed to be a rare
                 instruction, so the overhead should not matter.  We
                 aren't allowed to fix_new_exp for an expression which is
                 an  O_register at this point, however.  */
index 0455b3f3b254cef6fa14676abd77c42e4db74dc7..fefcf575074ab98cfbc1fcccada2c2ac4b931df1 100644 (file)
@@ -568,7 +568,7 @@ msp430_operands (opcode, line)
            res += msp430_dstoperand (&op2, l2, opcode->bin_opcode);
 
            if (res)
-             break;    /* An error occured.  All warnings were done before.  */
+             break;    /* An error occurred.  All warnings were done before.  */
 
            bin |= (op2.reg | (op1.reg << 8) | (op1.am << 4) | (op2.am << 7));
 
@@ -644,7 +644,7 @@ msp430_operands (opcode, line)
       res += msp430_dstoperand (&op2, l2, opcode->bin_opcode);
 
       if (res)
-       break;                  /* Error occured.  All warnings were done before.  */
+       break;                  /* Error occurred.  All warnings were done before.  */
 
       bin |= (op2.reg | (op1.reg << 8) | (op1.am << 4) | (op2.am << 7));
 
@@ -741,7 +741,7 @@ msp430_operands (opcode, line)
             mov r5,r6
             jmp -2
 
-            is equial to:
+            is equal to:
             lab:
             mov r5,r6
             jmp lab
@@ -960,7 +960,7 @@ msp430_srcoperand (op, l, bin, imm_op)
            }
 
          /* Now check constants.  */
-         /* Substitude register mode with a constant generator if applicable.  */
+         /* Substitute register mode with a constant generator if applicable.  */
 
          x = (short) x;        /* Extend sign.  */
 
@@ -1129,7 +1129,7 @@ msp430_srcoperand (op, l, bin, imm_op)
       return 0;
     }
 
-  /* Check if inderect register mode @Rn / postincrement @Rn+.  */
+  /* Check if indirect register mode @Rn / postincrement @Rn+.  */
   if (*l == '@')
     {
       char *t = l;
index eca23999a6cab2eb7331fc942bc9ed592691cb73..4284e55c2a53c0abbc01f5fd5d29826130cbe579 100644 (file)
@@ -176,7 +176,7 @@ char *input_line_pointer;
 
         3,     the entry is a pointer at a bignum struct
 
-   The low-order-byte coresponds to low physical memory.
+   The low-order-byte corresponds to low physical memory.
    Obviously a FRAGment must be created for each valid disp in PART whose
    datalength is undefined (to bad) .
    The case where just the expression is undefined is less severe and is
@@ -332,7 +332,7 @@ const pseudo_typeS md_pseudo_table[] =
 #define DOUBLE         2
 #define UNDEF           3
 /* Those limits are calculated from the displacement start in memory.
-   The ns32k uses the begining of the instruction as displacement
+   The ns32k uses the beginning of the instruction as displacement
    base.  This type of displacements could be handled here by moving
    the limit window up or down. I choose to use an internal
    displacement base-adjust as there are other routines that must
@@ -441,7 +441,7 @@ addr_mode (operand, addr_modeP, recursive_level)
            case '+':
              if (str[2] != '\000')
                {
-                 addr_modeP->mode = 27;        /* pc-relativ */
+                 addr_modeP->mode = 27;        /* pc-relative */
                  addr_modeP->disp[0] = str + 2;
                  return -1;
                }
@@ -675,9 +675,9 @@ get_addr_mode (ptr, addr_modeP)
 
   if (addr_modeP->mode == DEFAULT || addr_modeP->scaled_mode == -1)
     {
-      /* Resolve ambigious operands, this shouldn't be necessary if
+      /* Resolve ambiguous operands, this shouldn't be necessary if
         one uses standard NSC operand syntax. But the sequent
-        compiler doesn't!!!  This finds a proper addressinging mode
+        compiler doesn't!!!  This finds a proper addressing mode
         if it is implicitly stated. See ns32k-opcode.h.  */
       (void) evaluate_expr (&exprP, ptr); /* This call takes time Sigh!  */
 
@@ -888,7 +888,7 @@ evaluate_expr (resultP, ptr)
    Operands are parsed in such an order that the opcode is updated from
    its most significant bit, that is when the operand need to alter the
    opcode.
-   Be carefull not to put to objects in the same iif-slot.  */
+   Be careful not to put to objects in the same iif-slot.  */
 
 static void encode_operand
   PARAMS ((int, char **, const char *, const char *, char, char));
@@ -979,7 +979,7 @@ encode_operand (argc, argv, operandsP, suffixP, im_size, opcode_bit_ptr)
          freeptr++;            /* OVE:this is an useful hack.  */
          sprintf (freeptr, "((%s-1)*%d)", argv[i], desc->im_size);
          argv[i] = freeptr;
-         pcrel -= 1;           /* Make pcrel 0 inspite of what case 'p':
+         pcrel -= 1;           /* Make pcrel 0 in spite of what case 'p':
                                   wants.  */
          /* fall thru */
        case 'p':               /* Displacement - pc relative addressing.  */
@@ -1258,7 +1258,7 @@ parse (line, recursive_level)
    assembler. You only need to know if it's possible to reduce your
    cpu-instruction to iif-format (takes some work) and adopt the other
    md_? parts according to given instructions Note that iif was
-   invented for the clean ns32k`s architecure.  */
+   invented for the clean ns32k`s architecture.  */
 
 /* GAS for the ns32k has a problem. PC relative displacements are
    relative to the address of the opcode, not the address of the
@@ -2436,4 +2436,4 @@ cons_fix_new_ns32k (where, fixP, segment_address_in_file)
 }
 
 #endif /* OBJ_AOUT */
-#endif /* BFD_ASSMEBLER */
+#endif /* BFD_ASSEMBLER */
index 114495870b6050ae1e22744fb94f0cff5695ffa9..4fd91f0c7a21961cbcd937da20ecc7ee15bfb10d 100644 (file)
@@ -230,7 +230,7 @@ md_begin ()
   encode (&machine_opcodes[insn_index ("l.jalr")], &jalr_r9_opcode, 9, 'B');
 }
 
-/* Returs non zero if instruction is to be used.  */
+/* Returns non zero if instruction is to be used.  */
 
 static int
 check_invalid_opcode (opcode)
index cfed1cb5fb5922e42d82502c4835e54398066737..1a31a02b00b0cd9f3bfbb185c94c257053ab3129 100644 (file)
@@ -60,8 +60,8 @@ extern int or32_unrecognized_line PARAMS ((int));
 #endif
 
 /* Should the reloc be output ?
-   on the 29k, this is true only if there is a symbol attatched.
-   on the h8, this is allways true, since no fixup is done.  */
+   on the 29k, this is true only if there is a symbol attached.
+   on the h8, this is always true, since no fixup is done.  */
 #define TC_COUNT_RELOC(x)           (x->fx_addsy)
 #define TC_CONS_RELOC               RELOC_32
 
index e27dae02ab0f7442fb982f9d0e2f2857a2f0b356..a0666e17dee88c4f0d4cf8467d508dbe0f8033e1 100644 (file)
@@ -189,7 +189,7 @@ ipush_code (opcode, str)
 }
 
 /* Insert names into the opcode table which are really mini macros,
-   not opcodes.  The fakeness is inidicated with an opcode of -1.  */
+   not opcodes.  The fakeness is indicated with an opcode of -1.  */
 
 static void
 fake_opcode (name, func)
index c806f010eee971a420f4c8750ec005dfd0ab50fd..84698bef9e848797eecfe41e0b67a13d68db6107 100644 (file)
@@ -1319,7 +1319,7 @@ md_begin ()
 
   ppc_setup_opcodes ();
 
-  /* Tell the main code what the endianness is if it is not overidden
+  /* Tell the main code what the endianness is if it is not overridden
      by the user.  */
   if (!set_target_endian)
     {
@@ -2882,7 +2882,7 @@ static bfd_boolean ppc_stab_symbol;
 
 /* The .comm and .lcomm pseudo-ops for XCOFF.  XCOFF puts common
    symbols in the .bss segment as though they were local common
-   symbols, and uses a different smclas.  The native Aix 4.3.3 assember
+   symbols, and uses a different smclas.  The native Aix 4.3.3 assembler
    aligns .comm and .lcomm to 4 bytes.  */
 
 static void
@@ -3437,7 +3437,7 @@ ppc_stabx (ignore)
 
 /* The .function pseudo-op.  This takes several arguments.  The first
    argument seems to be the external name of the symbol.  The second
-   argment seems to be the label for the start of the function.  gcc
+   argument seems to be the label for the start of the function.  gcc
    uses the same name for both.  I have no idea what the third and
    fourth arguments are meant to be.  The optional fifth argument is
    an expression for the size of the function.  In COFF this symbol
index 61764efe41e806cddfbbe7b69c9cb76a60639977..ef51bca4e560b76ff4a729bb6c4d5babd0ef32dc 100644 (file)
@@ -424,7 +424,7 @@ md_parse_option (c, arg)
       break;
 
     case 'A':
-      /* Option -A is deprecated. Still available for compatability.  */
+      /* Option -A is deprecated. Still available for compatibility.  */
       if (arg != NULL && strcmp (arg, "esa") == 0)
        current_cpu = S390_OPCODE_G5;
       else if (arg != NULL && strcmp (arg, "esame") == 0)
@@ -1357,7 +1357,7 @@ md_gather_operands (str, insn, opcode)
          /* After a displacement a block in parentheses can start.  */
          if (*str != '(')
            {
-             /* Check if parethesed block can be skipped. If the next
+             /* Check if parenthesized block can be skipped. If the next
                 operand is neiter an optional operand nor a base register
                 then we have a syntax error.  */
              operand = s390_operands + *(++opindex_ptr);
@@ -1368,7 +1368,7 @@ md_gather_operands (str, insn, opcode)
              while (!(operand->flags & S390_OPERAND_BASE))
                operand = s390_operands + *(++opindex_ptr);
 
-             /* If there is a next operand it must be seperated by a comma.  */
+             /* If there is a next operand it must be separated by a comma.  */
              if (opindex_ptr[1] != '\0')
                {
                  if (*str++ != ',')
@@ -1401,7 +1401,7 @@ md_gather_operands (str, insn, opcode)
          if (*str++ != ')')
            as_bad (_("syntax error; missing ')' after base register"));
          skip_optional = 0;
-         /* If there is a next operand it must be seperated by a comma.  */
+         /* If there is a next operand it must be separated by a comma.  */
          if (opindex_ptr[1] != '\0')
            {
              if (*str++ != ',')
@@ -1420,7 +1420,7 @@ md_gather_operands (str, insn, opcode)
                as_bad (_("syntax error; ')' not allowed here"));
              str++;
            }
-         /* If there is a next operand it must be seperated by a comma.  */
+         /* If there is a next operand it must be separated by a comma.  */
          if (opindex_ptr[1] != '\0')
            {
              if (*str++ != ',')
index dabd5d4faa4da0e96048d49286d779fcb4190e1f..0bacdce122efe6de719977e9918b5539922ea8d5 100644 (file)
@@ -136,7 +136,7 @@ int sh_small;
 static int preset_target_arch;
 
 /* The bit mask of architectures that could
-   accomodate the insns seen so far.  */
+   accommodate the insns seen so far.  */
 static int valid_arch;
 
 const char EXP_CHARS[] = "eE";
@@ -151,7 +151,7 @@ const char FLT_CHARS[] = "rRsSfFdDxXpP";
 #define ENCODE_RELAX(what,length) (((what) << 4) + (length))
 #define GET_WHAT(x) ((x>>4))
 
-/* These are the three types of relaxable instrction.  */
+/* These are the three types of relaxable instruction.  */
 /* These are the types of relaxable instructions; except for END which is
    a marker.  */
 #define COND_JUMP 1
@@ -1338,7 +1338,7 @@ parse_at (char *src, sh_operand_info *op)
                     no matter if expr is a constant, or a more complex
                     expression, e.g. sym-. or sym1-sym2.
                     However, we also used to accept @(sym,pc)
-                    as adressing sym, i.e. meaning the same as plain sym.
+                    as addressing sym, i.e. meaning the same as plain sym.
                     Some existing code does use the @(sym,pc) syntax, so
                     we give it the old semantics for now, but warn about
                     its use, so that users have some time to fix their code.
@@ -3023,7 +3023,7 @@ md_section_align (segT seg ATTRIBUTE_UNUSED, valueT size)
 }
 
 /* This static variable is set by s_uacons to tell sh_cons_align that
-   the expession does not need to be aligned.  */
+   the expression does not need to be aligned.  */
 
 static int sh_no_align_cons = 0;
 
@@ -3364,7 +3364,7 @@ md_apply_fix3 (fixS *fixP, valueT *valP, segT seg ATTRIBUTE_UNUSED)
     case BFD_RELOC_SH_PCRELIMM8BY4:
       /* The lower two bits of the PC are cleared before the
          displacement is added in.  We can assume that the destination
-         is on a 4 byte bounday.  If this instruction is also on a 4
+         is on a 4 byte boundary.  If this instruction is also on a 4
          byte boundary, then we want
           (target - here) / 4
         and target - here is a multiple of 4.
index 7c401b90491a2f92d7c059547929932e1b5e6b8e..7a6f830e405d025497721c9238f667722ffbbcbe 100644 (file)
@@ -2459,7 +2459,7 @@ shmedia_find_cooked_opcode (char **str_p)
       /* The machine independent code will convert CMP/EQ into cmp/EQ
         because it thinks the '/' is the end of the symbol.  Moreover,
         all but the first sub-insn is a parallel processing insn won't
-        be capitailzed.  Instead of hacking up the machine independent
+        be capitalized.  Instead of hacking up the machine independent
         code, we just deal with it here.  */
       c = TOLOWER (c);
       name[nlen] = c;
index f3ef720147e57944e696ae0e907ade99e5e5d21f..c78bd27b40242ed8df4c1dd8d9d5e9886c5e09b8 100644 (file)
@@ -727,7 +727,7 @@ struct
   {NULL, NULL, NULL},
 };
 \f
-/* sparc64 priviledged registers.  */
+/* sparc64 privileged registers.  */
 
 struct priv_reg_entry
 {
@@ -3941,7 +3941,7 @@ s_common (ignore)
   }
 }
 
-/* Handle the .empty pseudo-op.  This supresses the warnings about
+/* Handle the .empty pseudo-op.  This suppresses the warnings about
    invalid delay slot usage.  */
 
 static void
@@ -4008,7 +4008,7 @@ s_proc (ignore)
 }
 
 /* This static variable is set by s_uacons to tell sparc_cons_align
-   that the expession does not need to be aligned.  */
+   that the expression does not need to be aligned.  */
 
 static int sparc_no_align_cons = 0;