- May 31, 2006
-
-
Richard Earnshaw authored
arm.c (arm_print_operand case 'S'): Validate that the operand is a shift operand before calling shift_op. * arm.c (arm_print_operand case 'S'): Validate that the operand is a shift operand before calling shift_op. Avoid redundant call of shift_op. From-SVN: r114264
-
Mark Mitchell authored
PR c++/26433 * g++.dg/template/fntry1.C: Add dg-do link. From-SVN: r114263
-
Mark Mitchell authored
PR c++/27808 * parser.c (cp_parser_decl_specifier_seq): Issue errors about "friend" specifiers that do not appear in class scopes. PR c++/27808 * g++.dg/parse/friend6.C: New test. From-SVN: r114259
-
GCC Administrator authored
From-SVN: r114257
-
- May 30, 2006
-
-
Asher Langton authored
2006-05-30 Asher Langton <langton2@llnl.gov> * symbol.c (check_conflict): Allow external, function, and subroutine attributes with Cray pointees. * trans-expr.c (gfc_conv_function_val): Translate Cray pointees that point to procedures. * gfortran.texi: Document new feature. * gfortran.dg/cray_pointers_7.f90: New test. From-SVN: r114252
-
Naveen.H.S authored
* config/m32c/m32c.c (m32c_expand_insv): Check that the value we're inserting is a singlt-bit constant. Co-Authored-By:
DJ Delorie <dj@redhat.com> From-SVN: r114250
-
Roger Sayle authored
simplify-rtx.c (simplify_binary_operation_1): Cast width to HOST_WIDE_INT to avoid comparison warnings on some targets. * simplify-rtx.c (simplify_binary_operation_1) <LSHIFTRT>: Cast width to HOST_WIDE_INT to avoid comparison warnings on some targets. From-SVN: r114248
-
Roger Sayle authored
PR tree-optimization/23452 * fold-const.c (fold_mult_zconjz): New subroutine of fold_binary, to optimize z * conj(z) as realpart(z)^2 + imagpart(z)^2. (fold_binary) <MULT_EXPR>: Call fold_mult_zconjz for integral complex values and with -ffast-math for FP complex values. * gcc.dg/fold-mulconj-1.c: New test case. From-SVN: r114246
-
Mark Mitchell authored
PR c++/27803 * class.c (check_bitfield_decl): Ensure that all bitfields have integral type. PR c++/27803 * g++.dg/parse/bitfield1.C: New test. From-SVN: r114245
-
Kazu Hirata authored
* c-common.h: Remove the prototype for yyparse. * rtl.h: Remove the prototype for init_loop. From-SVN: r114242
-
Andreas Krebbel authored
2006-05-30 Andreas Krebbel <krebbel1@de.ibm.com> * cse.c (validate_canon_reg, cse_insn): Don't change insns without calling recog. From-SVN: r114241
-
Roger Sayle authored
* simplify-rtx.c (simplify_binary_operation): Unfactor the shift and rotate cases. <LSHIFTRT>: Optimize (lshiftrt (clz X) C) as (eq X 0) where C is log2(GET_MODE_BITSIZE(X)) on targets with the appropriate semantics. * gcc.target/ppc-eq0-1.c: New test case. * gcc.target/ppc-negeq0-1.c: New test case. From-SVN: r114239
-
Dirk Mueller authored
re PR c/27273 (tree check fail for legal code when convert returns a constant from an expression that was not constant) PR c/27273 * c-common.c (convert_and_check): only track TREE_CONSTANT_OVERFLOW for CONSTANT_CLASS_P expressions. * gcc.dg/overflow-warn-5.c: New testcase. From-SVN: r114238
-
Volker Reichelt authored
PR c/27718 * c-typeck.c (c_expr_sizeof_type): Handle invalid types. * gcc.dg/sizeof-1.c: New test. From-SVN: r114234
-
Zdenek Dvorak authored
PR tree-optimization/27779 * tree-data-ref.c (analyze_siv_subscript_cst_affine): Use initial_condition instead of CHREC_LEFT. From-SVN: r114233
-
Steven Bosscher authored
* config/m32r/m32r.h (DBX_OUTPUT_SOURCE_LINE): Fix type of begin_label. * config/m32r/initfini.c (__do_global_dtors, __do_global_ctors): Make prototypes ISO C90. From-SVN: r114232
-
Mircea Namolaru authored
From-SVN: r114231
-
Mircea Namolaru authored
From-SVN: r114230
-
Uros Bizjak authored
PR target/27790 * config/i386/i386.c (ix86_expand_int_vcond): Force cop0 into register for (code == GTU). testsuite/ChangeLog: * gcc.target/i386/pr27790.c: New test. From-SVN: r114229
-
GCC Administrator authored
From-SVN: r114225
-
- May 29, 2006
-
-
Jerry DeLisle authored
2006-05-29 Jerry DeLisle <jvdelisle@gcc.gnu.org> PR libgfortran/27757 * gfortran.dg/direct_io_5.f90: New test. From-SVN: r114221
-
François-Xavier Coudert authored
* trans-array.c: Fix previous commit, which included parts of patches in preparation. From-SVN: r114219
-
Jerry DeLisle authored
2006-05-29 Jerry DeLisle <jvdelisle@gcc.gnu.org> PR libgfortran/27634 * gfortran.dg/fmt_missing_period_1.f: New test. * gfortran.dg/fmt_missing_period_2.f: New test. * gfortran.dg/fmt_missing_period_3.f: New test. From-SVN: r114214
-
Jerry DeLisle authored
2006-05-29 Jerry DeLisle <jvdelisle@gcc.gnu.org> PR fortran/27634 * io.c (check_format): Add error for missing period in format specifier unless -std=legacy. * gfortran.texi: Add description of expanded namelist read and missing period in format extensions. From-SVN: r114213
-
Francois-Xavier Coudert authored
PR fortran/19777 * trans-array.c (gfc_conv_array_ref): Perform out-of-bounds checking for assumed-size arrrays for all but the last dimension. * gfortran.dg/bounds_check_2.f: Add new check for multidimensional arrays. From-SVN: r114210
-
Volker Reichelt authored
PR c++/27713 * g++.dg/template/new6.C: New test. From-SVN: r114208
-
Roger Sayle authored
PR tree-optimization/24964 * simplify-rtx.c (simplify_binary_operation_1): Add function comment. <MULT>: Minor clean-up. Don't convert x*-1.0 into -x if we honor signaling NaNs. Optimize -x*-x as x*x for all float modes, and abs(x)*abs(x) as x*x for scalar floating point modes. * gcc.target/i386/387-10.c: New test case. From-SVN: r114206
-
Sebastian Pop authored
PR middle-end/27745 * lambda-code.c (perfect_nestify): Don't copy statements in the inner loop: move them to the inner loop header. From-SVN: r114205
-
Diego Novillo authored
PR 26237 * c-tree.texi: Document OpenMP directives and clauses. From-SVN: r114204
-
Kazu Hirata authored
From-SVN: r114203
-
Diego Novillo authored
PR 26242 * doc/passes.texi: Add documentation for pass_vrp, pass_ipa_pta, pass_fre, pass_store_ccp, pass_copy_prop, pass_store_copy_prop, pass_merge_phi, pass_nrv, pass_return_slot, pass_object_size, pass_lim, pass_linear_transform, pass_empty_loop, pass_complete_unroll, pass_loop_prefetch and pass_stdarg. From-SVN: r114200
-
Bernd Schmidt authored
* config/bfin/bfin.opt (mfdpic): New option. * config/bfin/t-bfin-elf (EXTRA_PARTS): Add crtbeginS.o and crtendS.o. (EXTRA_MULTILIB_PARTS): Likewise. (CRTSTUFF_T_CFLAGS, TARGET_LIBGCC2_CFLAGS): Use -fpic. (MULTILIB_OPTIONS, MULTILIB_EXCEPTIONS): Build one extra -mfdpic multilib. * config/bfin/elf.h (STARTFILE_SPEC): Don't link in crt0.o if -shared. (CRT_CALL_STATIC_FUNCTION): New. * config/bfin/uclinux.h (STARTFILE_SPEC): Don't link in crt0.o if -shared. (CRT_CALL_STATIC_FUNCTION): New. * config/bfin/bfin.c (legitimize_pic_address): Now static. Handle FD-PIC moves. (n_pregs_to_save): PIC register doesn't need to be saved with FD-PIC. (print_operand): Handle UNSPEC_MOVE_FDPIC and UNSPEC_FUNCDESC_GOT17M4. (initialize_trampoline): Changed to handle FD-PIC code generation. (expand_move): If TARGET_FDPIC, use emit_pic_move as needed. (bfin_expand_call): Generate FD-PIC calls if TARGET_FDPIC. (override_options): Disallow -mid-shared-library -mfdpic combination. Can't do unaligned ops if FD-PIC. Turn off flag_pic if trying to generate non-id-shared-library non-fdpic code, since it's not supported. (bfin_assemble_integer): New function. (TARGET_ASM_INTEGER): Define. * config/bfin/crti.s (__init, __fini): Save P3 on the stack if __BFIN_FDPIC__. * config/bfin/crtn.s: Restore them. * config/bfin/bfin.h (TARGET_CPU_CPP_BUILTINS): Define __BFIN_FDPIC__ if TARGET_FDPIC. (DRIVER_SELF_SPECS, SUBTARGET_DRIVER_SELF_SPECS, LINK_GCC_C_SEQUENCE_SPEC, ASM_SPEC, LINK_SPEC): New macros. (FDPIC_FPTR_REGNO, FDPIC_REGNO, OUR_FDPIC_REG): New macros. (TRAMPOLINE_SIZE, TRAMPOLINE_TEMPLATE): Adjust for FD-PIC. (CONDITIONAL_REGISTER_USAGE): If TARGET_FDPIC, FDPIC_REGNO is call-used. (enum reg_class, REG_CLASS_CONTENTS, REG_CLASS_NAMES): Add FDPIC_REGS and FDPIC_FPTR_REGS. (REG_CLASS_FROM_LETTER): Use 'Z' and 'Y' for them. * config/bfin/bfin.md (UNSPEC_MOVE_FDPIC, UNSPEC_FUNCDESC_GOT17M4, UNSPEC_VOLATILE_LOAD_FUNCDESC): New constants. (load_funcdescsi): New pattern. (call_symbol_fdpic, sibcall_symbol_fdpic, call_value_symbol_fdpic, sibcall_value_symbol_fdpic, call_insn_fdpic, sibcall_insn_fdpic, call_value_insn_fdpic, sibcall_value_insn_fdpic): New patterns. From-SVN: r114199
-
Kazu Hirata authored
* tree-flow.h: Remove the prototype for add_type_alias. * tree-ssa-alias.c (add_type_alias): Remove. From-SVN: r114197
-
Kazu Hirata authored
From-SVN: r114196
-
Kazu Hirata authored
* gcse.c, rtlanal.c: Remove obsolete comments associated with loop.c. From-SVN: r114195
-
Jakub Jelinek authored
* javaop.h (int16, int32, int64): Define to exactly 16 (resp. 32, 64) bit wide type. (jword): Define to uint64 on 64-bit arches. * jcf-dump.c (print_constant): Cast JPOOL_UINT to long. From-SVN: r114191
-
Francois-Xavier Coudert authored
From-SVN: r114188
-
Mike Stump authored
From-SVN: r114186
-
Kazu Hirata authored
* pt.c (convert_nontype_argument): Fix a typo in an error message. From-SVN: r114185
-
Kazu Hirata authored
* options.c, primary.c, resolve.c, trans-common.c: Fix typos in error messages. From-SVN: r114183
-