Skip to content
Snippets Groups Projects
  1. May 05, 2011
    • Joseph Myers's avatar
      * configure.ac (alpha*-dec-osf*, i[[3456789]]86-*-rdos*, · 6a789d5e
      Joseph Myers authored
      	sh*-*-pe|mips*-*-pe|arm-wince-pe, sparc-*-sunos4*, *-*-aix*,
      	*-*-beos*, *-*-chorusos, *-*-dragonfly*, *-*-freebsd*, *-*-linux*
      	| *-*-gnu* | *-*-k*bsd*-gnu | *-*-kopensolaris*-gnu, *-*-lynxos*,
      	*-*-mingw*, *-*-netbsd*, *-*-netware*, *-*-tpf*, *-*-uclinux*,
      	*-*-vxworks*): Disable newlib and libgloss in separate case
      	statement.
      	(i[[3456789]]86-*-linux*): Move logic allowing newlib to be built
      	to separate case statement.
      	(*-*-chorusos, *-*-dragonfly*, *-*-freebsd*, *-*-netbsd*,
      	*-*-netware*, *-*-tpf*, *-*-uclinux*, *-*-vxworks*,
      	alpha*-dec-osf*, alpha*-*-linux*, am33_2.0-*-linux*, sh-*-linux*,
      	sh*-*-pe|mips*-*-pe|*arm-wince-pe, arm-*-coff, arm-*-elf* |
      	arm*-*-eabi*, arm*-*-linux-gnueabi, arm*-*-symbianelf*, avr-*-*,
      	bfin-*-*, cris-*-* | crisv32-*-*, frv-*-*, i[[3456789]]86-*-coff |
      	i[[3456789]]86-*-elf, i[[3456789]]86-w64-mingw*,
      	i[[3456789]]86-*-mingw*, x86_64-*-mingw*,
      	i[[3456789]]86-*-interix*, i[[3456789]]86-*-beos*,
      	i[[3456789]]86-*-rdos*, m32r-*-*,
      	m68hc11-*-*|m6811-*-*|m68hc12-*-*|m6812-*-*, m68k-*-elf*, m68*-*-*
      	| fido-*-*, powerpc-*-aix*, powerpc-*-beos*, powerpc-*-eabi,
      	powerpc-*-eabi* | powerpcle-*-eabi* | powerpc-*-rtems*,
      	rs6000-*-lynxos*, rs6000-*-aix*, mips*-*-linux*, sparclet-*-aout*
      	| sparc86x-*-*, sparc-*-elf*, sparc64-*-elf*, sparclite-*-*,
      	sparc-*-sunos4*, sparc-*-solaris* | sparc64-*-solaris* |
      	sparcv9-*-solaris*, *-*-linux* | *-*-gnu* | *-*-k*bsd*-gnu |
      	*-*-kopensolaris*-gnu, *-*-lynxos*, *-*-*): Don't disable newlib
      	and libgloss in main case over targets.  Remove most empty cases
      	in main case over targets.
      	* configure: Regenerate.
      
      From-SVN: r173430
      6a789d5e
    • Michael Matz's avatar
      elf.h (ENDFILE_SPEC): Add Ofast. · 0691dde9
      Michael Matz authored
      	* config/alpha/elf.h (ENDFILE_SPEC): Add Ofast.
      	* config/alpha/osf5.h (ENDFILE_SPEC): Add Ofast.
      	* config/alpha/netbsd.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/linux.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/sp64-elf.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/sp-elf.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/linux64.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/freebsd.h (ENDFILE_SPEC): Add Ofast.
      	* config/sparc/sol2.h (ENDFILE_SPEC): Add Ofast.
      	* config/i386/cygwin.h (ENDFILE_SPEC): Add Ofast.
      	* config/i386/gnu-user.h (ENDFILE_SPEC): Add Ofast.
      	* config/i386/gnu-user64.h (ENDFILE_SPEC): Add Ofast.
      	* config/i386/darwin.h (ENDFILE_SPEC): Add Ofast.
      	* config/i386/mingw32.h (ENDFILE_SPEC): Add Ofast.
      	* config/ia64/linux.h (ENDFILE_SPEC): Add Ofast.
      	* config/mips/linux.h (ENDFILE_SPEC): Add Ofast.
      
      From-SVN: r173429
      0691dde9
    • Richard Guenther's avatar
      expmed.c (expand_variable_shift): Rename to ... · 86529a49
      Richard Guenther authored
      2011-05-05  Richard Guenther  <rguenther@suse.de>
      
      	* expmed.c (expand_variable_shift): Rename to ...
      	(expand_shift_1): ... this.  Take an expanded shift amount.
      	For rotates recurse directly not building trees for the shift amount.
      	(expand_variable_shift): Wrap around expand_shift_1.
      	(expand_shift): Adjust.
      
      From-SVN: r173428
      86529a49
    • Jakub Jelinek's avatar
      re PR rtl-optimization/48381 (internal compiler error: in check_allocation, at ira.c:2094) · 82357998
      Jakub Jelinek authored
      	PR rtl-optimization/48381
      	* gcc.c-torture/compile/pr48381.c: New test.
      
      From-SVN: r173427
      82357998
    • Jakub Jelinek's avatar
      * gimplify.c (create_tmp_var_raw): Don't call build_type_variant. · d0228c2e
      Jakub Jelinek authored
      From-SVN: r173426
      d0228c2e
    • Uros Bizjak's avatar
      opt-1.c: Add --param min-insn-to-prefetch -ratio=0 to dg-options. · 62ffa8af
      Uros Bizjak authored
      	* gcc.target/i386/opt-1.c: Add --param min-insn-to-prefetch -ratio=0
      	to dg-options.
      	* gcc.target/i386/opt-1.c: Ditto.
      
      From-SVN: r173425
      62ffa8af
    • Eric Botcazou's avatar
      tree.h (get_pending_sizes): Remove prototype. · 907a08d9
      Eric Botcazou authored
      	* tree.h (get_pending_sizes): Remove prototype.
      	(put_pending_size): Likewise.
      	(put_pending_sizes): Likewise.
      	* stor-layout.c (pending_sizes): Delete.
      	(get_pending_sizes): Likewise.
      	(put_pending_size): Likewise.
      	(put_pending_sizes): Likewise.
      	(variable_size): Do not call put_pending_size and tidy up.
      	* function.h (struct function): Remove dont_save_pending_sizes_p.
      	* lto-streamer-in.c (input_function): Do not stream it.
      	* lto-streamer-out.c (output_function): Likewise.
      	* tree-inline.c (initialize_cfun): Do not copy it.
      	* c-decl.c (store_parm_decls): Do not set it.
      	* omp-low.c (create_task_copyfn): Likewise.
      	* tree-optimize.c (tree_rest_of_compilation): Likewise.
      cp/
      	* decl.c (start_preparsed_function): Likewise.
      fortran/
      	* trans-decl.c (trans_function_start): Likewise.
      ada/
      	* gcc-interface/utils.c (begin_subprog_body): Do not call
      	get_pending_sizes.
      	(end_subprog_body): Likewise.
      
      From-SVN: r173424
      907a08d9
    • Uros Bizjak's avatar
      i386.md (*movdf_internal_rex64): Simplify nested "if" conditions. · 386d9c57
      Uros Bizjak authored
      	* config/i386/i386.md (*movdf_internal_rex64): Simplify nested "if"
      	conditions.
      	(*movdf_internal): Ditto.
      	(*movdf_internal_nointeger): Ditto.
      	(*movsf_internal): Ditto.
      
      From-SVN: r173423
      386d9c57
    • Joseph Myers's avatar
      c-decl.c (finish_decl): Don't call get_pending_sizes. · a04a722b
      Joseph Myers authored
      	* c-decl.c (finish_decl): Don't call get_pending_sizes.
      	(grokparm): Add parameter expr.  Pass it to grokdeclarator.
      	(push_parm_decl): Add parameter expr.  Pass it to grokdeclarator.
      	(c_variable_size): Remove.
      	(grokdeclarator): Use save_expr instead of c_variable_size.  Don't
      	call put_pending_sizes.
      	(get_parm_info): Add parameter expr.  Use it to set
      	arg_info->pending_sizes.
      	(store_parm_decls): Use arg_info->pending_sizes instead or calling
      	get_pending_sizes.
      	* c-parser.c (c_parser_parms_declarator): Update call to
      	c_parser_parms_list_declarator.
      	(c_parser_parms_list_declarator): Take parameter expr.  Update
      	call to push_parm_decl.  Update recursive call.  Don't call
      	get_pending_sizes.  Update calls to get_parm_info.
      	(c_parser_objc_method_definition): Update calls to
      	c_parser_objc_method_decl and objc_start_method_definition.
      	(c_parser_objc_methodproto): Update call to
      	c_parser_objc_method_decl.
      	(c_parser_objc_method_decl): Add parameter expr.  Update call to
      	grokparm.
      	(c_parser_objc_try_catch_finally_statement): Update call to
      	grokparm.
      	* c-tree.h (struct c_arg_info.pending_sizes): Change to a tree.
      	(get_parm_info, grokparm, push_parm_decl): Update prototypes.
      
      c-family:
      	* c-objc.h (objc_start_method_definition): Update prototype.
      	* stub-objc.c (objc_start_method_definition): Add extra parameter.
      
      cp:
      	* parser.c (cp_parser_objc_method_definition_list): Update call to
      	objc_start_method_definition.
      
      objc:
      	* objc-act.c (objc_start_method_definition): Add parameter expr.
      	Update call to start_method_def.
      	(objc_generate_cxx_ctor_or_dtor, objc_synthesize_getter,
      	objc_synthesize_setter) Update calls to
      	objc_start_method_definition.
      	(objc_get_parm_info): Add parameter expr.  Update call to
      	get_parm_info.
      	(start_method_def): Add parameter expr.  Update call to
      	objc_get_parm_info.
      	* objc-gnu-runtime-abi-01.c (build_module_initializer_routine):
      	Update call to objc_get_parm_info.
      	* objc-runtime-shared-support.h (objc_get_parm_info): Add extra
      	parameter.
      
      From-SVN: r173422
      a04a722b
    • Michael Hope's avatar
      For Michael Hope. · c92a6f97
      Michael Hope authored
      2011-05-05  Michael Hope  <michael.hope@linaro.org>
      
             PR pch/45979
             * config/host-linux.c (TRY_EMPTY_VM_SPACE): Define for
             __ARM_EABI__ hosts.
      
      From-SVN: r173421
      c92a6f97
    • Ulrich Weigand's avatar
      spu.c (TARGET_ASM_OUTPUT_MI_THUNK): Define. · 07ea0048
      Ulrich Weigand authored
      	* config/spu/spu.c (TARGET_ASM_OUTPUT_MI_THUNK): Define.
      	(TARGET_ASM_CAN_OUTPUT_MI_THUNK): Likewise.
      	(spu_output_mi_thunk): New function.
      
      From-SVN: r173420
      07ea0048
    • Rainer Orth's avatar
      sol2.h (ASM_OUTPUT_CALL): Use targetm.asm_out.print_operand. · d634bfa1
      Rainer Orth authored
      	* config/sparc/sol2.h (ASM_OUTPUT_CALL): Use
      	targetm.asm_out.print_operand.
      	* config/sol2.c: Include target.h.
      
      From-SVN: r173419
      d634bfa1
    • Ian Lance Taylor's avatar
      Use backend interface for slice types. · 817b15ca
      Ian Lance Taylor authored
      From-SVN: r173415
      817b15ca
    • Janis Johnson's avatar
      * MAINTAINERS: Add myself (write after approval). · a78079c4
      Janis Johnson authored
      From-SVN: r173413
      a78079c4
    • Jason Merrill's avatar
      re PR c++/48749 (internal compiler error: tree check: expected field_decl) · 4d3baecc
      Jason Merrill authored
      	PR c++/48749
      	* class.c (resolves_to_fixed_type_p): Don't look closely
      	in templates.
      
      From-SVN: r173412
      4d3baecc
    • Joern Rennecke's avatar
      * config-list.mk: New file. · adad1007
      Joern Rennecke authored
      From-SVN: r173410
      adad1007
    • Jerry DeLisle's avatar
      re PR libfortran/48787 (Invalid UP/DOWN rounding with F editing) · 80d45c04
      Jerry DeLisle authored
      2011-05-04  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/48787
      	gfortran.dg/round_3.f08: Add more checks to test case.
      
      From-SVN: r173409
      80d45c04
    • Jerry DeLisle's avatar
      re PR libfortran/48787 (Invalid UP/DOWN rounding with F editing) · d6b872ad
      Jerry DeLisle authored
      2011-05-04  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/48787
      	* io/write_float.def (output_float): Adjust up and down rounding for
      	cases where 'd' = 0. Gather common code to one location.
      
      From-SVN: r173408
      d6b872ad
    • GCC Administrator's avatar
      Daily bump. · c5c04a8f
      GCC Administrator authored
      From-SVN: r173407
      c5c04a8f
  2. May 04, 2011
    • Mike Stump's avatar
      Regenerate. · edeab219
      Mike Stump authored
      From-SVN: r173402
      edeab219
    • Mike Stump's avatar
      Remove extra spacing at the end of the line. · ff2ce160
      Mike Stump authored
      From-SVN: r173401
      ff2ce160
    • Marc Glisse's avatar
      PR libstdc++/47913 (again) · 91e4938b
      Marc Glisse authored
      2011-05-04  Marc Glisse  <marc.glisse@normalesup.org>
      
      	PR libstdc++/47913 (again)
      	* include/std/ratio (ratio_add, ratio_less): Rewrite.
      	* testsuite/20_util/ratio/operations/47913.cc: Extend.
      	* testsuite/20_util/ratio/cons/cons_overflow_neg.cc: Adjust dg-error
      	line numbers.
      	* testsuite/20_util/ratio/operations/ops_overflow_neg.cc: Likewise.
      
      From-SVN: r173400
      91e4938b
    • Jan Hubicka's avatar
      ipa-inline.c (reset_edge_caches): New function. · 40fda55b
      Jan Hubicka authored
      	* ipa-inline.c (reset_edge_caches): New function.
      	(update_caller_keys): Add check_inlinablity_for; do not
      	reset edge caches; remove now unnecesary loop.
      	(update_callee_keys): Add comments; reset
      	node_growth_cache of callee.
      	(update_all_callee_keys): Likewise.
      	(inline_small_functions): Sanity check cache; update code
      	recomputing it.
      
      From-SVN: r173399
      40fda55b
    • Hans-Peter Nilsson's avatar
      pr47878.f90, [...]: Gate test on effective_target fd_truncate. · bf9fa1b9
      Hans-Peter Nilsson authored
      	* gfortran.dg/pr47878.f90, gfortran.dg/endfile_3.f90,
      	gfortran.dg/endfile_4.f90, gfortran.dg/ftell_3.f90,
      	gfortran.dg/fmt_cache_1.f, gfortran.dg/namelist_66.f90:
      	Gate test on effective_target fd_truncate.
      
      From-SVN: r173397
      bf9fa1b9
    • Joseph Myers's avatar
      configure.ac: Remove code setting special library locations for hppa*64*-*-hpux11*. · f1a0defe
      Joseph Myers authored
      	* configure.ac: Remove code setting special library locations for
      	hppa*64*-*-hpux11*.  Remove code setting compiler for
      	sparc-sun-solaris2*.
      	* configure: Regenerate.
      
      From-SVN: r173396
      f1a0defe
    • Bernd Schmidt's avatar
      re PR rtl-optimization/47612 (RTL crash when cc0 setter moved away from cc0 user) · 0360f70d
      Bernd Schmidt authored
      	PR rtl-optimization/47612
      	* df-problems.c (can_move_insns_across): Don't pick a cc0 setter
      	as the last insn of the sequence to be moved.
      
      From-SVN: r173393
      0360f70d
    • Chris Demetriou's avatar
      morestack.S (__i686.get_pc_thunk.bx): Rename to... · a3330c9d
      Chris Demetriou authored
      2011-05-04  Chris Demetriou  <cgd@google.com>
      
              * config/i386/morestack.S (__i686.get_pc_thunk.bx): Rename to...
              (__x86.get_pc_thunk.bx): ...this.
              (__morestack): Adjust for rename, remove undef of __i686.
      
      From-SVN: r173391
      a3330c9d
    • Uros Bizjak's avatar
      recip-vec-divf.c: Decrease array sizes. · 19defc33
      Uros Bizjak authored
      	* gcc.target/i386/recip-vec-divf.c: Decrease array sizes.
      	* gcc.target/i386/recip-vec-sqrtf.c: Ditto.
      	* gcc.target/i386/recip-vec-divf-avx.c: Increase array sizes.
      	* gcc.target/i386/recip-vec-sqrtf-avx.c: Ditto.  Update scan times.
      	* gcc.target/i386/ssefn-1.c: Add -mno-sse2 to dg-options.
      	* gcc.target/i386/pr38824.c: Ditto.
      	* gcc.target/i386/vecinit-1.c: Add -mno-sse4 to dg-options.
      	* gcc.target/i386/vecinit-2.c: Ditto.
      	* gcc.target/i386/sse-19.c: Add -mno-ssse3 to dg-options.
      	* gcc.target/i386/parity-1.c: Add -mno-popcnt to dg-options.
      	* gcc.target/i386/parity-2.c: Ditto.
      	* gcc.target/i386/incoming-8.c: Add -mno-avx to dg-options.
      
      From-SVN: r173390
      19defc33
    • Mike Stump's avatar
      Fixup whitespacing. · 944fb799
      Mike Stump authored
      From-SVN: r173388
      944fb799
    • Nathan Froyd's avatar
      remove gfc_chainon_list · 42375e2e
      Nathan Froyd authored
      remove gfc_chainon_list
      	* trans.h (gfc_chainon_list): Delete.
      	* trans.c (gfc_chainon_list): Delete.
      
      From-SVN: r173386
      42375e2e
    • Tobias Burnus's avatar
      re PR fortran/48864 (-Ofast should imply -fno-protect-parens) · 7a994646
      Tobias Burnus authored
      gcc/
      2011-05-04  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/48864
              * doc/invoke.texi (Ofast): Document that it
              enables Fortran's -fno-protect-parens.
      
      gcc/fortran
      2011-05-04  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/48864
              * invoke.texi (fno-protect-parens): Document
              that -Ofast implies -fno-protect-parens.
              * options.c (gfc_init_options, gfc_post_options):
              Make -Ofast imply -fno-protect-parens.
      
      From-SVN: r173385
      7a994646
    • Nathan Froyd's avatar
      don't use TYPE_ARG_TYPES in c-family/ · e19a18d4
      Nathan Froyd authored
      don't use TYPE_ARG_TYPES in c-family/
      	* c-common.c (check_main_parameter_types): Reindent.  Don't use
      	TYPE_ARG_TYPES directly.
      	(handle_nonnull_attribute): Likewise.
      	(sync_resolve_params): Likewise.
      	* c-format.c (handle_format_arg_attribute): Likewise.  Adjust call
      	to check_format_string.
      	(handle_format_attribute): Likewise.
      	(check_format_string): Take a function type to examine instead of
      	a type list.  Use a function_arg_iterator to step through argument
      	types.
      
      From-SVN: r173384
      e19a18d4
    • Uros Bizjak's avatar
      i386.c (ix86_reorg): Run move_or_delete_vzeroupper first. · 7a2f7208
      Uros Bizjak authored
      	* config/i386/i386.c (ix86_reorg): Run move_or_delete_vzeroupper first.
      
      From-SVN: r173383
      7a2f7208
    • Eric Botcazou's avatar
      * stor-layout.c (variable_size): Do not issue errors. · a2d42931
      Eric Botcazou authored
      From-SVN: r173381
      a2d42931
    • Ian Lance Taylor's avatar
      Use backend interface for named types and array types. · 7fc2f86b
      Ian Lance Taylor authored
      	* go-gcc.cc (Gcc_backend::struct_type): Call fill_in_struct.
      	(Gcc_backend::fill_in_struct): New function.
      	(Gcc_backend::array_type): Implement.
      	(Gcc_backend::fill_in_array): New function.
      	(Gcc_backend::placeholder_pointer_type): New function.
      	(Gcc_backend::set_placeholder_pointer_type): New function.
      	(Gcc_backend::set_placeholder_function_type): New function.
      	(Gcc_backend::placeholder_struct_type): New function.
      	(Gcc_backend::set_placeholder_struct_type): New function.
      	(Gcc_backend::placeholder_array_type): New function.
      	(Gcc_backend::set_placeholder_array_type): New function.
      	(Gcc_backend::named_type): New function.
      	(Gcc_backend::circular_pointer_type): New function.
      	(Gcc_backend::is_circular_pointer_type): New function.
      
      From-SVN: r173380
      7fc2f86b
    • Richard Guenther's avatar
      coverage.c (tree_coverage_counter_ref): Use integer_type_node for array-ref indices. · f81b1a3d
      Richard Guenther authored
      2011-05-04  Richard Guenther  <rguenther@suse.de>
      
      	* coverage.c (tree_coverage_counter_ref): Use integer_type_node
      	for array-ref indices.
      	(tree_coverage_counter_addr): Likewise.
      	(build_fn_info_type): Use size_int for index types.
      	(build_gcov_info): Likewise.
      
      From-SVN: r173379
      f81b1a3d
    • Richard Guenther's avatar
      c-decl.c (check_bitfield_type_and_width): Do not pass NULL to build_int_cst. · c62c040f
      Richard Guenther authored
      2011-05-04  Richard Guenther  <rguenther@suse.de>
      
      	* c-decl.c (check_bitfield_type_and_width): Do not pass NULL
      	to build_int_cst.
      	* c-typeck.c (really_start_incremental_init): Use bitsize_int
      	for constructor indices.
      	(push_init_level): Likewise.
      
      	c-family/
      	* c-common.c (fix_string_type): Use size_int for index type bounds.
      	(start_fname_decls): Do not pass NULL to build_int_cst.
      	(c_init_attributes): Likewise.
      	* c-lex.c (c_lex_with_flags): Likewise.
      
      From-SVN: r173378
      c62c040f
    • Richard Guenther's avatar
      explow.c (promote_mode): Move variable declarations before code. · 1e3287d0
      Richard Guenther authored
      2011-05-04  Richard Guenther  <rguenther@suse.de>
      
              * explow.c (promote_mode): Move variable declarations before code.
      
      From-SVN: r173376
      1e3287d0
    • Nathan Froyd's avatar
      tree.h (build_function_type_array): Declare. · 6c32445b
      Nathan Froyd authored
      gcc/
      	* tree.h (build_function_type_array): Declare.
      	(build_varargs_function_type_array): Declare.
      	(build_function_type_vec, build_varargs_function_type_vec): Define.
      	* tree.c (build_function_type_array_1): New function.
      	(build_function_type_array): New function.
      	(build_varargs_function_type_array): New function.
      
      gcc/fortran/
      	* trans-decl.c (build_library_function_decl_1): Call
      	build_function_type_vec.  Adjust argument list building accordingly.
      	* trans-intrinsic.c (gfc_get_intrinsic_lib_fndecl): Likewise.
      	* trans-types.c (gfc_get_function_type): Likewise.
      
      From-SVN: r173375
      6c32445b
    • Richard Guenther's avatar
      trans-array.c (gfc_trans_array_constructor_value): Use size_int for bounds of range types. · df09d1d5
      Richard Guenther authored
      2011-05-04  Richard Guenther  <rguenther@suse.de>
      
      	* trans-array.c (gfc_trans_array_constructor_value): Use
      	size_int for bounds of range types.
      	(gfc_trans_array_constructor_value): Use size_type_node
      	for memcpy argument.
      	* trans-common.c (build_field): Use gfc_charlen_type_node
      	for lengths.
      	* trans-openmp.c (gfc_trans_omp_clauses): Do not pass NULL
      	as type to build_int_cst.
      	* trans-const.c (gfc_build_string_const): Use size_int
      	for bounds of range types.
      	(gfc_build_wide_string_const): Likewise.
      	* trans-stmt.c (gfc_trans_label_assign): Use gfc_charlen_type_node
      	for lengths.
      	(gfc_trans_character_select): Likewise.
      	(gfc_trans_character_select): Do not pass NULL
      	as type to build_int_cst.
      	(gfc_trans_character_select): Use size_int for bounds of range types.
      	* trans-io.c (gfc_build_io_library_fndecls): Likewise.
      	(add_case): Do not pass NULL as type to build_int_cst.
      	(transfer_expr): Likewise.
      	(transfer_array_desc): Likewise.
      	* trans-decl.c (gfc_add_assign_aux_vars): Use gfc_charlen_type_node
      	for lengths.
      	(gfc_trans_assign_aux_var): Likewise.
      	(create_main_function): Use size_int for bounds of range types.
      	* trans-intrinsic.c (gfc_conv_intrinsic_minmax_char): Do not pass
      	NULL as type to build_int_cst.
      	(gfc_conv_intrinsic_spacing): Likewise.
      	(gfc_conv_intrinsic_rrspacing): Likewise.
      	(gfc_conv_intrinsic_len): Use gfc_charlen_type_node for lengths.
      
      From-SVN: r173374
      df09d1d5
Loading