Skip to content
Snippets Groups Projects
  1. Jul 08, 2011
    • Rainer Orth's avatar
      Makefile.in (LIBGCOV): Remove. · 2c50b2c3
      Rainer Orth authored
      	gcc:
      	* Makefile.in (LIBGCOV): Remove.
      	(libgcc.mvars): Remove LIBGCOV.
      	* libgov.c: Move to ../libgcc.
      
      	libgcc:
      	* Makfile.in (LIBGCOV): New variable.
      	($(libgcov-objects)): Use $(srcdir) to refer to libgcov.c.
      	* libgcov.c: New file.
      
      From-SVN: r176037
      2c50b2c3
  2. May 13, 2011
  3. Apr 29, 2011
  4. Jan 04, 2011
  5. Jan 03, 2011
  6. Nov 01, 2010
  7. Oct 17, 2010
    • Kai Tietz's avatar
      libgcov.c (create_file_directory): Enable it for win32 case. · 78e7dd6a
      Kai Tietz authored
      2010-10-17  Kai Tietz  <kai.tietz@onevision.com>
      
              * libgcov.c (create_file_directory): Enable it for win32 case.
              (gcov_exit): De-couple GCOV_PREFIX and GCOV_PREFIX_STRIP.
              * doc/gcov.texi (GCOV_PREFIX): Adjusted.
              (GCOV_PREFIX_SKIP): Likewise.
      
      From-SVN: r165596
      78e7dd6a
  8. Nov 28, 2009
    • Jakub Jelinek's avatar
      matrix-reorg.c (analyze_matrix_allocation_site): Remove unused malloc_fname variable. · 0f900dfa
      Jakub Jelinek authored
      	* matrix-reorg.c (analyze_matrix_allocation_site): Remove unused
      	malloc_fname variable.
      	(check_allocation_function): Remove unused gsi and bb_level_0
      	variables.
      	(transform_access_sites): Remove unused d_type_size and d_type_size_k
      	variables.
      	* omega.c (resurrect_subs): Remove unused n variable.
      	(omega_solve_geq): Remove unused neweqns variable.
      	* lto-streamer-in.c (lto_read_tree): Remove unused end_marker variable.
      	* tree-inline.c (declare_return_variable): Remove USE_P argument,
      	return use instead of var.
      	(remap_decl, remap_block): Remove unused fn variable.
      	(expand_call_inline): Remove unused retvar variable, adjust
      	declare_return_variable caller.
      	(optimize_inline_calls): Remove unused prev_fn variable.
      	* tree-vect-slp.c (vect_analyze_slp_instance): Remove unused ncopies
      	variable.
      	(vect_create_mask_and_perm): Remove unused group_size and dr_chain_size
      	variables.
      	* tree-ssa-loop-niter.c (split_to_var_and_offset): Handle MINUS_EXPR
      	properly.
      	* tree-vect-loop.c (vect_analyze_loop_form): Remove unused backedge
      	variable.
      	(vect_create_epilog_for_reduction): Remove unused bytesize variable.
      	* omp-low.c (workshare_safe_to_combine_p): Remove par_entry_bb
      	parameter.  Remove unused par_stmt variable.
      	(determine_parallel_type): Adjust workshare_safe_to_combine_p caller.
      	(expand_omp_sections): Remove unused l1 variable.
      	(lower_omp_for): Remove unused ilist variable.
      	* tree-loop-distribution.c (mark_nodes_having_upstream_mem_writes):
      	Remove unused has_upstream_mem_write_p variable.
      	* recog.c (decode_asm_operands): Remove unused noperands variable.
      	* tree-ssa-alias.c (refs_may_alias_p_1): Remove unused size1 and
      	size2 variable.
      	* libgcov.c (__gcov_merge_delta): Remove unused last variable.
      	* tree-call-cdce.c (gen_conditions_for_pow_int_base): Remove unused
      	base_nm variable.
      	(gen_conditions_for_pow): Remove unused ec variable.
      	* tree-ssa-sccvn.c (vn_reference_lookup_3): Remove unused size
      	variable.
      	* ipa-struct-reorg.c (program_redefines_malloc_p): Remove unused
      	fndecl variable.
      	* tree-ssa-sink.c (statement_sink_location): Remove unused code
      	variable.
      	* regmove.c (copy_src_to_dest): Remove unused insn_uid and move_uid
      	variables.
      	* tree-complex.c (create_one_component_var): Remove unused inner_type
      	variable.
      	* calls.c (emit_call_1): Don't GEN_INT (struct_value_size)
      	unnecessarily when GEN_*CALL omits that argument.
      	* regrename.c (regrename_optimize): Remove unused regs_seen variable.
      	(build_def_use): Remove unused icode variable.
      	* ipa-pure-const.c (check_call): Remove unused callee and avail
      	variables.
      	* tree-dfa.c (add_referenced_var): Remove unused v_ann variable.
      	* tree-vect-patterns.c (vect_recog_pow_pattern): Remove unused type
      	variable.
      	(vect_pattern_recog): Remove unused stmt variable.
      	* sel-sched-ir.c (make_regions_from_the_rest): Remove unused
      	new_regions variable.
      	* postreload.c (reload_cse_simplify_operands): Remove unused mode
      	variable.
      	* tree-parloops.c (create_call_for_reduction_1): Remove unused
      	addr_type variable.
      	(create_parallel_loop): Remove unused res variable.
      	(gen_parallel_loop): Remove unused nloop variable.
      	* tree-vect-loop-manip.c (vect_loop_versioning): Likewise.
      	* value-prof.c (gimple_mod_subtract_transform,
      	gimple_stringops_transform): Remove unused value variable.
      	(gimple_stringops_values_to_profile): Remove unused fcode variable.
      	* tree-vrp.c (register_new_assert_for): Remove unused found variable.
      	(vrp_visit_switch_stmt): Remove unused n variable.
      	* tree-vect-stmts.c (vectorizable_conversion): Remove unused expr
      	variable.
      	(vectorizable_operation): Remove unused shift_p variable.
      	(vectorizable_store): Remove unused first_stmt_vinfo variable.
      	* tree-ssa-operands.c (add_stmt_operand): Remove unused v_ann variable.
      	* tree-vect-data-refs.c (vect_analyze_data_refs): Remove unused bb
      	variable.
      	(vect_permute_store_chain): Remove unused scalar_dest variable.
      	(vect_supportable_dr_alignment): Remove unused invariant_in_outerloop
      	variable.
      	* tree-ssa-threadupdate.c (thread_single_edge): Remove unused
      	local_info variable.
      	* tree-optimize.c (tree_rest_of_compilation): Remove unused node
      	variable.
      	* optabs.c (expand_binop): Remove unused equiv_value variable.
      	(emit_libcall_block): Remove unused prev variable.
      	(init_optabs): Remove unused int_mode variable.
      	* tree-ssa-structalias.c (scc_visit): Remove unused have_ref_node
      	variable.
      	(do_structure_copy): Remove unused lhsbase and rhsbase variables.
      	(find_func_aliases): Remove unused rhstype variable.
      	(ipa_pta_execute): Remove unused varid variable.
      gcc/objc/
      	* objc-act.c (generate_shared_structures): Remove unused sc_spec and
      	decl_specs variables.
      	(objc_build_message_expr): Remove unused loc variable.
      	(objc_finish_message_expr): Remove unused saved_rtype variable.
      	(encode_field_decl): Remove unused type variable.
      gcc/lto/
      	* lto-lang.c (handle_nonnull_attribute): Remove unused attr_arg_num
      	variable.
      
      From-SVN: r154726
      0f900dfa
  9. Nov 25, 2009
    • H.J. Lu's avatar
      Remove trailing white spaces. · b8698a0f
      H.J. Lu authored
      2009-11-25  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* alias.c: Remove trailing white spaces.
      	* alloc-pool.c: Likewise.
      	* alloc-pool.h: Likewise.
      	* attribs.c: Likewise.
      	* auto-inc-dec.c: Likewise.
      	* basic-block.h: Likewise.
      	* bb-reorder.c: Likewise.
      	* bt-load.c: Likewise.
      	* builtins.c: Likewise.
      	* builtins.def: Likewise.
      	* c-common.c: Likewise.
      	* c-common.h: Likewise.
      	* c-cppbuiltin.c: Likewise.
      	* c-decl.c: Likewise.
      	* c-format.c: Likewise.
      	* c-lex.c: Likewise.
      	* c-omp.c: Likewise.
      	* c-opts.c: Likewise.
      	* c-parser.c: Likewise.
      	* c-pretty-print.c: Likewise.
      	* c-tree.h: Likewise.
      	* c-typeck.c: Likewise.
      	* caller-save.c: Likewise.
      	* calls.c: Likewise.
      	* cfg.c: Likewise.
      	* cfganal.c: Likewise.
      	* cfgexpand.c: Likewise.
      	* cfghooks.c: Likewise.
      	* cfghooks.h: Likewise.
      	* cfglayout.c: Likewise.
      	* cfgloop.c: Likewise.
      	* cfgloop.h: Likewise.
      	* cfgloopmanip.c: Likewise.
      	* cfgrtl.c: Likewise.
      	* cgraph.c: Likewise.
      	* cgraph.h: Likewise.
      	* cgraphbuild.c: Likewise.
      	* cgraphunit.c: Likewise.
      	* cif-code.def: Likewise.
      	* collect2.c: Likewise.
      	* combine.c: Likewise.
      	* convert.c: Likewise.
      	* coverage.c: Likewise.
      	* crtstuff.c: Likewise.
      	* cse.c: Likewise.
      	* cselib.c: Likewise.
      	* dbgcnt.c: Likewise.
      	* dbgcnt.def: Likewise.
      	* dbgcnt.h: Likewise.
      	* dbxout.c: Likewise.
      	* dce.c: Likewise.
      	* ddg.c: Likewise.
      	* ddg.h: Likewise.
      	* defaults.h: Likewise.
      	* df-byte-scan.c: Likewise.
      	* df-core.c: Likewise.
      	* df-problems.c: Likewise.
      	* df-scan.c: Likewise.
      	* df.h: Likewise.
      	* dfp.c: Likewise.
      	* diagnostic.c: Likewise.
      	* diagnostic.h: Likewise.
      	* dominance.c: Likewise.
      	* domwalk.c: Likewise.
      	* double-int.c: Likewise.
      	* double-int.h: Likewise.
      	* dse.c: Likewise.
      	* dwarf2asm.c: Likewise.
      	* dwarf2asm.h: Likewise.
      	* dwarf2out.c: Likewise.
      	* ebitmap.c: Likewise.
      	* ebitmap.h: Likewise.
      	* emit-rtl.c: Likewise.
      	* et-forest.c: Likewise.
      	* except.c: Likewise.
      	* except.h: Likewise.
      	* expmed.c: Likewise.
      	* expr.c: Likewise.
      	* expr.h: Likewise.
      	* final.c: Likewise.
      	* flags.h: Likewise.
      	* fold-const.c: Likewise.
      	* function.c: Likewise.
      	* function.h: Likewise.
      	* fwprop.c: Likewise.
      	* gcc.c: Likewise.
      	* gcov-dump.c: Likewise.
      	* gcov-io.c: Likewise.
      	* gcov-io.h: Likewise.
      	* gcov.c: Likewise.
      	* gcse.c: Likewise.
      	* genattr.c: Likewise.
      	* genattrtab.c: Likewise.
      	* genautomata.c: Likewise.
      	* genchecksum.c: Likewise.
      	* genconfig.c: Likewise.
      	* genflags.c: Likewise.
      	* gengtype-parse.c: Likewise.
      	* gengtype.c: Likewise.
      	* gengtype.h: Likewise.
      	* genmddeps.c: Likewise.
      	* genmodes.c: Likewise.
      	* genopinit.c: Likewise.
      	* genpreds.c: Likewise.
      	* gensupport.c: Likewise.
      	* ggc-common.c: Likewise.
      	* ggc-page.c: Likewise.
      	* ggc-zone.c: Likewise.
      	* ggc.h: Likewise.
      	* gimple-iterator.c: Likewise.
      	* gimple-low.c: Likewise.
      	* gimple-pretty-print.c: Likewise.
      	* gimple.c: Likewise.
      	* gimple.def: Likewise.
      	* gimple.h: Likewise.
      	* gimplify.c: Likewise.
      	* graphds.c: Likewise.
      	* graphite-clast-to-gimple.c: Likewise.
      	* gthr-nks.h: Likewise.
      	* gthr-posix.c: Likewise.
      	* gthr-posix.h: Likewise.
      	* gthr-posix95.h: Likewise.
      	* gthr-single.h: Likewise.
      	* gthr-tpf.h: Likewise.
      	* gthr-vxworks.h: Likewise.
      	* gthr.h: Likewise.
      	* haifa-sched.c: Likewise.
      	* hard-reg-set.h: Likewise.
      	* hooks.c: Likewise.
      	* hooks.h: Likewise.
      	* hosthooks.h: Likewise.
      	* hwint.h: Likewise.
      	* ifcvt.c: Likewise.
      	* incpath.c: Likewise.
      	* init-regs.c: Likewise.
      	* integrate.c: Likewise.
      	* ipa-cp.c: Likewise.
      	* ipa-inline.c: Likewise.
      	* ipa-prop.c: Likewise.
      	* ipa-pure-const.c: Likewise.
      	* ipa-reference.c: Likewise.
      	* ipa-struct-reorg.c: Likewise.
      	* ipa-struct-reorg.h: Likewise.
      	* ipa-type-escape.c: Likewise.
      	* ipa-type-escape.h: Likewise.
      	* ipa-utils.c: Likewise.
      	* ipa-utils.h: Likewise.
      	* ipa.c: Likewise.
      	* ira-build.c: Likewise.
      	* ira-color.c: Likewise.
      	* ira-conflicts.c: Likewise.
      	* ira-costs.c: Likewise.
      	* ira-emit.c: Likewise.
      	* ira-int.h: Likewise.
      	* ira-lives.c: Likewise.
      	* ira.c: Likewise.
      	* jump.c: Likewise.
      	* lambda-code.c: Likewise.
      	* lambda-mat.c: Likewise.
      	* lambda-trans.c: Likewise.
      	* lambda.h: Likewise.
      	* langhooks.c: Likewise.
      	* lcm.c: Likewise.
      	* libgcov.c: Likewise.
      	* lists.c: Likewise.
      	* loop-doloop.c: Likewise.
      	* loop-init.c: Likewise.
      	* loop-invariant.c: Likewise.
      	* loop-iv.c: Likewise.
      	* loop-unroll.c: Likewise.
      	* lower-subreg.c: Likewise.
      	* lto-cgraph.c: Likewise.
      	* lto-compress.c: Likewise.
      	* lto-opts.c: Likewise.
      	* lto-section-in.c: Likewise.
      	* lto-section-out.c: Likewise.
      	* lto-streamer-in.c: Likewise.
      	* lto-streamer-out.c: Likewise.
      	* lto-streamer.c: Likewise.
      	* lto-streamer.h: Likewise.
      	* lto-symtab.c: Likewise.
      	* lto-wpa-fixup.c: Likewise.
      	* matrix-reorg.c: Likewise.
      	* mcf.c: Likewise.
      	* mode-switching.c: Likewise.
      	* modulo-sched.c: Likewise.
      	* omega.c: Likewise.
      	* omega.h: Likewise.
      	* omp-low.c: Likewise.
      	* optabs.c: Likewise.
      	* optabs.h: Likewise.
      	* opts-common.c: Likewise.
      	* opts.c: Likewise.
      	* params.def: Likewise.
      	* params.h: Likewise.
      	* passes.c: Likewise.
      	* plugin.c: Likewise.
      	* postreload-gcse.c: Likewise.
      	* postreload.c: Likewise.
      	* predict.c: Likewise.
      	* predict.def: Likewise.
      	* pretty-print.c: Likewise.
      	* pretty-print.h: Likewise.
      	* print-rtl.c: Likewise.
      	* print-tree.c: Likewise.
      	* profile.c: Likewise.
      	* read-rtl.c: Likewise.
      	* real.c: Likewise.
      	* recog.c: Likewise.
      	* reg-stack.c: Likewise.
      	* regcprop.c: Likewise.
      	* reginfo.c: Likewise.
      	* regmove.c: Likewise.
      	* regrename.c: Likewise.
      	* regs.h: Likewise.
      	* regstat.c: Likewise.
      	* reload.c: Likewise.
      	* reload1.c: Likewise.
      	* resource.c: Likewise.
      	* rtl.c: Likewise.
      	* rtl.def: Likewise.
      	* rtl.h: Likewise.
      	* rtlanal.c: Likewise.
      	* sbitmap.c: Likewise.
      	* sched-deps.c: Likewise.
      	* sched-ebb.c: Likewise.
      	* sched-int.h: Likewise.
      	* sched-rgn.c: Likewise.
      	* sched-vis.c: Likewise.
      	* sdbout.c: Likewise.
      	* sel-sched-dump.c: Likewise.
      	* sel-sched-dump.h: Likewise.
      	* sel-sched-ir.c: Likewise.
      	* sel-sched-ir.h: Likewise.
      	* sel-sched.c: Likewise.
      	* sel-sched.h: Likewise.
      	* sese.c: Likewise.
      	* sese.h: Likewise.
      	* simplify-rtx.c: Likewise.
      	* stack-ptr-mod.c: Likewise.
      	* stmt.c: Likewise.
      	* stor-layout.c: Likewise.
      	* store-motion.c: Likewise.
      	* stringpool.c: Likewise.
      	* stub-objc.c: Likewise.
      	* sync-builtins.def: Likewise.
      	* target-def.h: Likewise.
      	* target.h: Likewise.
      	* targhooks.c: Likewise.
      	* targhooks.h: Likewise.
      	* timevar.c: Likewise.
      	* tlink.c: Likewise.
      	* toplev.c: Likewise.
      	* toplev.h: Likewise.
      	* tracer.c: Likewise.
      	* tree-affine.c: Likewise.
      	* tree-affine.h: Likewise.
      	* tree-browser.def: Likewise.
      	* tree-call-cdce.c: Likewise.
      	* tree-cfg.c: Likewise.
      	* tree-cfgcleanup.c: Likewise.
      	* tree-chrec.c: Likewise.
      	* tree-chrec.h: Likewise.
      	* tree-complex.c: Likewise.
      	* tree-data-ref.c: Likewise.
      	* tree-data-ref.h: Likewise.
      	* tree-dfa.c: Likewise.
      	* tree-dump.c: Likewise.
      	* tree-dump.h: Likewise.
      	* tree-eh.c: Likewise.
      	* tree-flow-inline.h: Likewise.
      	* tree-flow.h: Likewise.
      	* tree-if-conv.c: Likewise.
      	* tree-inline.c: Likewise.
      	* tree-into-ssa.c: Likewise.
      	* tree-loop-distribution.c: Likewise.
      	* tree-loop-linear.c: Likewise.
      	* tree-mudflap.c: Likewise.
      	* tree-nested.c: Likewise.
      	* tree-nomudflap.c: Likewise.
      	* tree-nrv.c: Likewise.
      	* tree-object-size.c: Likewise.
      	* tree-optimize.c: Likewise.
      	* tree-outof-ssa.c: Likewise.
      	* tree-parloops.c: Likewise.
      	* tree-pass.h: Likewise.
      	* tree-phinodes.c: Likewise.
      	* tree-predcom.c: Likewise.
      	* tree-pretty-print.c: Likewise.
      	* tree-profile.c: Likewise.
      	* tree-scalar-evolution.c: Likewise.
      	* tree-ssa-address.c: Likewise.
      	* tree-ssa-alias.c: Likewise.
      	* tree-ssa-ccp.c: Likewise.
      	* tree-ssa-coalesce.c: Likewise.
      	* tree-ssa-copy.c: Likewise.
      	* tree-ssa-copyrename.c: Likewise.
      	* tree-ssa-dce.c: Likewise.
      	* tree-ssa-dom.c: Likewise.
      	* tree-ssa-dse.c: Likewise.
      	* tree-ssa-forwprop.c: Likewise.
      	* tree-ssa-ifcombine.c: Likewise.
      	* tree-ssa-live.c: Likewise.
      	* tree-ssa-live.h: Likewise.
      	* tree-ssa-loop-ch.c: Likewise.
      	* tree-ssa-loop-im.c: Likewise.
      	* tree-ssa-loop-ivcanon.c: Likewise.
      	* tree-ssa-loop-ivopts.c: Likewise.
      	* tree-ssa-loop-manip.c: Likewise.
      	* tree-ssa-loop-niter.c: Likewise.
      	* tree-ssa-loop-prefetch.c: Likewise.
      	* tree-ssa-loop-unswitch.c: Likewise.
      	* tree-ssa-loop.c: Likewise.
      	* tree-ssa-math-opts.c: Likewise.
      	* tree-ssa-operands.c: Likewise.
      	* tree-ssa-operands.h: Likewise.
      	* tree-ssa-phiopt.c: Likewise.
      	* tree-ssa-phiprop.c: Likewise.
      	* tree-ssa-pre.c: Likewise.
      	* tree-ssa-propagate.c: Likewise.
      	* tree-ssa-reassoc.c: Likewise.
      	* tree-ssa-sccvn.c: Likewise.
      	* tree-ssa-sink.c: Likewise.
      	* tree-ssa-structalias.c: Likewise.
      	* tree-ssa-ter.c: Likewise.
      	* tree-ssa-threadedge.c: Likewise.
      	* tree-ssa-threadupdate.c: Likewise.
      	* tree-ssa-uncprop.c: Likewise.
      	* tree-ssa.c: Likewise.
      	* tree-ssanames.c: Likewise.
      	* tree-switch-conversion.c: Likewise.
      	* tree-tailcall.c: Likewise.
      	* tree-vect-data-refs.c: Likewise.
      	* tree-vect-generic.c: Likewise.
      	* tree-vect-loop-manip.c: Likewise.
      	* tree-vect-loop.c: Likewise.
      	* tree-vect-patterns.c: Likewise.
      	* tree-vect-slp.c: Likewise.
      	* tree-vect-stmts.c: Likewise.
      	* tree-vectorizer.c: Likewise.
      	* tree-vectorizer.h: Likewise.
      	* tree-vrp.c: Likewise.
      	* tree.c: Likewise.
      	* tree.def: Likewise.
      	* tree.h: Likewise.
      	* treestruct.def: Likewise.
      	* unwind-compat.c: Likewise.
      	* unwind-dw2-fde-glibc.c: Likewise.
      	* unwind-dw2.c: Likewise.
      	* value-prof.c: Likewise.
      	* value-prof.h: Likewise.
      	* var-tracking.c: Likewise.
      	* varasm.c: Likewise.
      	* varpool.c: Likewise.
      	* vec.c: Likewise.
      	* vec.h: Likewise.
      	* vmsdbgout.c: Likewise.
      	* web.c: Likewise.
      	* xcoffout.c: Likewise.
      
      From-SVN: r154645
      b8698a0f
  10. Apr 09, 2009
  11. Feb 20, 2009
  12. Jan 20, 2009
  13. Oct 29, 2008
  14. Jan 28, 2007
    • Jan Hubicka's avatar
      expr.c (emit_block_move_via_movmem, [...]): Add variant handling histograms; add wrapper. · 079a182e
      Jan Hubicka authored
      	* expr.c (emit_block_move_via_movmem, emit_block_move_via_libcall): Add
      	variant handling histograms; add wrapper.
      	(clear_storage_via_libcall): Export.
      	(emit_block_move_hints): Break out from ...; add histograms.
      	(emit_block_move): ... this one.
      	(clear_storage_hints): Break out from ...; add histograms.
      	(clear_storage): ... this one.
      	(set_storage_via_memset): Handle histogram.
      	* expr.h (emit_block_move_via_libcall, emit_block_move_hints): Declare.
      	(clear_storage_hints, clear_storage_via_libcall): Declare.
      	(set_storage_via_setmem): Update prototype.
      	* doc/md.texi (movmem, setmem): Document new arguments.
      
      	* value-prof.c (dump_histogram_value, tree_find_values_to_profile): Add
      	new histograms.
      	(stringop_block_profile): New global function.
      	(tree_stringops_values_to_profile): Profile block size and alignment.
      	* value-prof.h (enum hist_type): add HIST_TYPE_AVERAGE and
      	HIST_TYPE_IOR.
      	(struct profile_hooks): Add gen_average_profiler and gen_ior_profiler.
      	(stringop_block_profile): Declare.
      	* builtins.c: Include value-prof.h.
      	(expand_builtin_memcpy, expand_builtin_memset): Pass block profile.
      	* gcov-ui.h (GCOV_COUNTER_NAMES): Add new counter.
      	(GCOV_COUNTER_AVERAGE, GCOV_COUNTER_IOR): New constants.
      	(GCOV_COUNTERS, GCOV_LAST_VALUE_COUNTER): Update.
      	* profile.c (instrument_values): Add new counters.
      	* cfgexpand.c (expand_gimple_basic_block): Propagate histograms to
      	calls.
      	* tree-profile.c (tree_average_profiler_fn, tree_ior_profiler_fn): New.
      	(tree_init_edge_profiler): Build new profilers.
      	(tree_gen_average_profiler, tree_gen_ior_profiler): New.
      	(pass_tree_profile): Add dump.
      	(tree_profile_hooks): Update.
      	* Makefile.in (LIBGCOV): Add new constants.
      	* libgcov.c (__gcov_merge_ior, __gcov_average_profiler,
      	__gcov_ior_profiler): New.
      	* i386.md (movmem/setmem expanders): Add new optional arguments.
      
      From-SVN: r121270
      079a182e
  15. Jan 19, 2007
    • Tomas Bily's avatar
      Patch by Tomas Bily <tbily@suse.cz> · 6bad2617
      Tomas Bily authored
      Patch by Tomas Bily  <tbily@suse.cz>
              * cgraphunit.c (cgraph_finalize_function): Updating of pid
              * tree-profile.c:
              (tree_init_ic_make_global_vars): New function
              (tree_init_edge_profiler): call of tree_init_ic_make_global_vars
              (tree_gen_ic_profiler): New function
              (tree_gen_ic_func_profiler): New function
              (tree_profiling): Added calling of tree_gen_ic_func_profiler
              (tree_profile_hooks): Added hook for indirec/virtual calls
              * value-prof.c (tree_find_values_to_profile): New case for
              indirect calls
              (tree_values_to_profile): Call for determining indirect/virtual
              counters
              (tree_indirect_call_to_profile): New function
              (tree_ic_transform): New function
              (tree_ic): New function
              (find_func_by_pid): New function
              (init_pid_map): New function
              (tree_value_profile_transformations): Added check for
              indirect/virtual call transformation
              * value-prof.h (enum hist_type): New counter type for
              indirect/virtual calls
              (profile_hooks): Added new hook for profiling indirect/virtual
              calls
              * profile.c (instrument_values): New case for indirect/virtual
              call added
              * gcov-io.h (GCOV_LAST_VALUE_COUNTER): Changed to 6
              (GCOV_COUNTER_V_INDIR): New counter type
              (GCOV_COUNTER_NAMES): New name of counter "indirect" added
              (GCOV_MERGE_FUNCTIONS): New merge function for indirect/virtual
              call added
              * cgraph.c: Definition of cgraph_max_pid
              (cgraph_create_node): Default init of pid attribute
              * cgraph.h: Declaration of cgraph_max_pid
              (struct cgraph_node): Added pid attribute
              * libgcov.c (__gcov_indirect_call_profiler): New function
      	(__gcov_one_value_profiler_body): New function
      	(__gcov_one_value_profiler): Body was moved to
      	__gcov_one_value_profiler_body and calls it
      
      	gcc.dg/tree-prof/indir-call-prof.c: New.
      	g++.dg/dg.exp: Add tree-prof subdirectory.
      	g++.dg/tree-prof/indir-call-prof.C: New.
      	g++.dg/tree-prof/tree-prof.exp: New.
      
      From-SVN: r120975
      6bad2617
  16. Dec 18, 2005
    • Gabriel Dos Reis's avatar
      tree-vn.c (vn_add): Use XNEW. · 858904db
      Gabriel Dos Reis authored
              * tree-vn.c (vn_add): Use XNEW.
              * tree-ssa-ccp.c (ccp_initialize): Use XNEWVEC.
              (ccp_fold): Likewise.
              (fold_stmt_r): Use explicit cast to convert from void *.
              * tree-outof-ssa.c (new_temp_expr_table): Use XCNEWVEC.
              (new_temp_expr_table): Likewise.
              * gimplify.c (lookup_tmp_var): Use XNEW.
              (gimplify_asm_expr): Use explcit cast to convert from void *.
              * tree-into-ssa.c (get_ssa_name_ann): Likewise.
              (get_def_blocks_for): Use XNEW.
              (add_to_repl_tbl): Likewise.
              (mark_def_sites): Use explicit cast to convert from void *.
              (def_blocks_free): Likewise.
              (mark_def_sites_initialize_block): Likewise.
              (update_ssa): Use XNEWVEC.
              * tree-dfa.c (create_var_ann): Use GGC_NEW.
              (create_stmt_ann): Likewise.
              (create_tree_ann): Likewise.
              (referenced_var_insert): Likewise.
              (set_default_def): Likewise.
              (referenced_var_lookup_if_exists): Use explicit cast to
              * convert
              from void *.
              (referenced_var_lookup): Likewise.
              (default_def): Likewise.
              (set_default_def): Likewise.
              * tree-cfg.c (create_bb): Likewise.
              (edge_to_cases_cleanup): Likewise.
              (verify_node_sharing): Likewise.
              (record_switch_edge): Use XNEW.
              (cleanup_dead_labels): Use XCNEWVEC.
              (tree_duplicate_sese_region): Use XNEWVEC.
              * tree-scalar-evolution.c (get_instantiated_value): Likewise.
              * tree-ssa.c (verify_ssa): Use XCNEWVEC.
              (int_tree_map_eq): Use explicit cast to convert from void *.
              * libgcov.c (gcov_exit): Use explicit cast to convert from
              * void *.
              (__gcov_execl): Likewise.
              (__gcov_execlp): Likewise.
              (__gcov_execle): Likewise.
              * tree-eh.c (struct_ptr_eq): Likewise.
              (struct_ptr_hash): Likewise.
              (lookup_stmt_eh_region_fn): Likewise.
              (outside_finally_tree): Likewise.
              (find_goto_replacement): Likewise.
              (make_eh_edge): Likewise.
              (mark_eh_edge): Likewise.
              (add_stmt_to_eh_region_fn): Use GGC_NEW.
              (record_in_finally_tree): Use XNEW.
              (maybe_record_in_goto_queue): Use XRESIZEVEC.
              (lower_try_finally_copy): Use XCNEWVEC.
      
      From-SVN: r108736
      858904db
  17. Jul 13, 2005
    • H.J. Lu's avatar
      linux.h (TARGET_HAS_F_SETLKW): Renamed to ... · 4969c0d8
      H.J. Lu authored
      2005-07-13  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* config/alpha/linux.h (TARGET_HAS_F_SETLKW): Renamed to ...
      	(TARGET_POSIX_IO): This.
      	* config/darwin.h: Likewise.
      	* config/freebsd.h: Likewise.
      	* config/linux.h: Likewise.
      	* config/lynx.h: Likewise.
      	* config/netbsd.h: Likewise.
      	* config/rs6000/linux64.h: Likewise.
      	* config/rs6000/linux.h: Likewise.
      	* config/s390/tpf.h: Likewise.
      	* config/sh/embed-elf.h: Likewise.
      	* config/sparc/linux64.h: Likewise.
      	* config/sparc/linux.h: Likewise.
      	* config/svr4.h: Likewise.
      	* gcov-io.h: Likewise.
      
      	* doc/tm.texi: Updated.
      
      	* libgcov.c (create_file_directory): Defined only if
      	TARGET_POSIX_IO is defined.
      	(gcov_exit): Call create_file_directory only if TARGET_POSIX_IO
      	is defined.
      
      From-SVN: r101973
      4969c0d8
  18. Jun 25, 2005
  19. May 11, 2005
  20. May 10, 2005
    • Grigory Zagorodnev's avatar
      libgcov.c (create_file_directory): New function. · 992f396f
      Grigory Zagorodnev authored
      	* libgcov.c (create_file_directory): New function. Create
      	directory for the given file name.
      	(gcov_max_filename): New static var. Keeps size of the longest
      	file name.
      	(gcov_exit): Always try to create directory for output
      	file. Relocate each filename basing on environment vars.
      	(__gcov_init): Remember the longest file name.
      	* tsystem.h: include filenames.h to get IS_DIR_SEPARATOR
      	* doc/gcov.texi (Cross-profiling): New node documenting
      	cross-profiling management.
      	* doc/invoke.texi (-fprofile-arcs): Add xref to cross-profiling.
      
      From-SVN: r99523
      992f396f
  21. May 08, 2005
    • Nathan Sidwell's avatar
      Makefile.in (cs-tconfig.h): Pass USED_FOR_TARGET to mkconfig.sh · 232b67d9
      Nathan Sidwell authored
      
      	* Makefile.in (cs-tconfig.h): Pass USED_FOR_TARGET to mkconfig.sh
      	* aclocal.m4 (GCC_TARGET_TEMPLATE, AH_TEMPLATE): New.
      	* configure.ac (enable_checking): Fix typos in runtime_checking.
      	(ENABLE_RUNTIME_CHECKING): Mark as target template.
      	(xm_file): Prepend auto-host.h
      	(HAVE_GAS_HIDDEN, HAVE_LD_EH_FRAME_HDR): Mark as target template.
      	* mkconfig.sh: Do not automatically define USED_FOR_TARGET in
      	tconfig.h.
      	* crtstuff.c: Do not include auto-host.h.
      	(IN_LIBGCC2): Do not define.
      	* gcov-io.h: Include tconfig.h, not auto-host.h.
      	* libgcc2.c: Do not include auto-host.h.
      	(abort): Do not undefine.
      	* libgcov.c: Remove unneeded comment about config.h.
      	* unwind-dw2-fde-glibc.c: Do not inlude auto-host.h.
      	* config.in, configure: Regenerated.
      
      Co-Authored-By: default avatarPaolo Bonzini <bonzini@gnu.org>
      
      From-SVN: r99386
      232b67d9
  22. Apr 28, 2005
    • Kazu Hirata's avatar
      attribs.c, [...]: Update copyright. · fe9565ed
      Kazu Hirata authored
      	* attribs.c, c-pragma.c, caller-save.c, cfghooks.h,
      	coverage.c, cselib.h, domwalk.c, domwalk.h, errors.c,
      	errors.h, gcov-dump.c, gcov-io.c, gcov-io.h, gen-protos.c,
      	genattrtab.h, genextract.c, gthr-win32.h, insn-notes.def,
      	integrate.c, lambda-mat.c, lambda.h, libgcov.c, local-alloc.c,
      	machmode.def, mips-tfile.c, params.c, pretty-print.c,
      	print-rtl.c, protoize.c, regmove.c, sched-vis.c, tree-chrec.h,
      	tree-data-ref.h, vec.h, config/darwin-c.c, config/sol2-c.c,
      	config/sol2.c, config/arm/arm-cores.def, config/arm/cirrus.md,
      	config/arm/symbian.h, config/c4x/c4x.c, config/c4x/c4x.h,
      	config/i386/cygming.h, config/i386/djgpp.h,
      	config/i386/lynx.h, config/i386/netware.c,
      	config/i386/winnt.c, config/ia64/ia64-c.c,
      	config/iq2000/iq2000.c, config/m32r/little.h,
      	config/m68k/m68k-protos.h, config/m68k/m68k.h,
      	config/m68k/m68k.md, config/mcore/mcore.c,
      	config/mcore/mcore.h, config/mmix/mmix.c, config/mmix/mmix.md,
      	config/mn10300/mn10300-protos.h, config/mn10300/mn10300.c,
      	config/mn10300/mn10300.h, config/ns32k/netbsd.h,
      	config/ns32k/ns32k.c, config/ns32k/ns32k.h,
      	config/pa/pa-hpux11.h, config/pdp11/pdp11.c,
      	config/pdp11/pdp11.h, config/rs6000/darwin.h,
      	config/rs6000/default64.h, config/rs6000/rs6000-c.c,
      	config/s390/2064.md, config/s390/2084.md,
      	config/s390/s390-modes.def, config/s390/s390-protos.h,
      	config/s390/tpf.h, config/sh/sh.h, config/sh/symbian.c,
      	config/stormy16/stormy16.c, config/vax/vax-protos.h,
      	config/vax/vax.c, config/vax/vax.h,
      	config/xtensa/lib1funcs.asm, config/xtensa/xtensa.md: Update
      	copyright.
      
      From-SVN: r98914
      fe9565ed
  23. Apr 22, 2005
    • Zdenek Dvorak's avatar
      Makefile.in (LIBGCOV): Add _gcov_interval_profiler, _gcov_pow2_profiler and... · 9885da8e
      Zdenek Dvorak authored
      Makefile.in (LIBGCOV): Add _gcov_interval_profiler, _gcov_pow2_profiler and _gcov_one_value_profiler.
      
      	* Makefile.in (LIBGCOV): Add _gcov_interval_profiler,
      	_gcov_pow2_profiler and _gcov_one_value_profiler.
      	(tree-profile.o): Add GGC_H and gt-tree-profile.h dependency.
      	(GTFILES): Add $(srcdir)/tree-profile.c.
      	* gcov-io.h (__gcov_interval_profiler, __gcov_pow2_profiler,
      	__gcov_one_value_profiler): Declare.
      	* gimplify.c (force_gimple_operand): Check whether the statements
      	should be produced in ssa form.
      	(force_gimple_operand_bsi): New function.
      	* libgcov.c (__gcov_interval_profiler, __gcov_pow2_profiler,
      	__gcov_one_value_profiler): New functions.
      	* rtl-profile.c (rtl_gen_pow2_profiler): Only measure whether
      	the profiled value is a power of two or not.
      	* tree-cfg.c (tree_block_ends_with_condjump_p): Handle empty blocks.
      	* tree-flow.h (in_ssa_p): Declare.
      	(force_gimple_operand_bsi): Declare.
      	* tree-into-ssa.c (in_ssa_p): New variable.
      	(rewrite_into_ssa): Set in_ssa_p.
      	* tree-outof-ssa.c (rewrite_out_of_ssa): Set in_ssa_p.
      	* tree-profile.c: Include ggc.h and gt-tree-profile.h.
      	(gcov_type_node, tree_interval_profiler_fn, tree_pow2_profiler_fn,
      	tree_one_value_profiler_fn): New variables.
      	(tree_init_edge_profiler): Initialize the profiler function decls.
      	(tree_gen_edge_profiler): Use global gcov_type_node.
      	(prepare_instrumented_value): New function.
      	(tree_gen_interval_profiler, tree_gen_interval_profiler,
      	tree_gen_one_value_profiler): Call the library functions instead of
      	creating instrumentation code.
      	* tree.c (build_fn_decl): New function.
      	* tree.h (build_fn_decl): Declare.
      	* value-prof.c (rtl_divmod_values_to_profile,
      	rtl_find_values_to_profile, rtl_mod_pow2_value_transform,
      	tree_mod_pow2_value_transform, tree_find_values_to_profile):
      	Do not handle may_be_other and precise values of exponents at pow2
      	profiler.
      	(tree_mod_subtract_transform): Reflect that value field of
      	histogram has changed meaning.
      	(tree_divmod_values_to_profile): Record the values correctly.
      	(tree_values_to_profile): Update comment.
      	* value-prof.h (struct histogram_value_t): Remove pow2 data.
      
      From-SVN: r98555
      9885da8e
  24. Apr 01, 2005
    • Nathan Sidwell's avatar
      gcov-io.h (GCOV_CHECK, [...]): Remove. · cccd217d
      Nathan Sidwell authored
      	* gcov-io.h (GCOV_CHECK, GCOV_CHECK_READING,
      	GCOV_CHECK_WRITING): Remove.
      	(gcov_position, gcov_rewrite): Use gcc_assert.
      	* gcov-io.c (gcov_open, gcov_write_words, gcov_write_length,
      	gcov_read_words, gcov_sync, gcov_seek): Use gcc_assert.
      	* libgcov.c (__gcov_merge_single, __gcov_merge_delta): Use
      	gcc_assert.
      
      From-SVN: r97392
      cccd217d
  25. Jul 29, 2004
    • Nathan Sidwell's avatar
      gcov-io.h: Allow zero tag as EOF indicator. · 00cf2913
      Nathan Sidwell authored
      	* gcov-io.h: Allow zero tag as EOF indicator.
      	(gcov_is_eof): Remove.
      	(gcov_truncate): Remove.
      	* gcov-io.c (gcov_seek): Always SEEK_SET.
      	* libgcov.c (gcov_exit): Don't use gcov_truncate.  Write explicit
      	EOF tag.
      	* coverage.c (read_counts_file): Don't use gcov_is_eof.
      	* gcov-dump.c (dump_file): Likewise.
      	* gcov.c (read_graph_file, read_count_file): Likewise.
      
      From-SVN: r85291
      00cf2913
  26. Apr 23, 2004
    • Zdenek Dvorak's avatar
      Makefile.in (LIBGCOV): Add _gcov_fork... · d1c38823
      Zdenek Dvorak authored
      	* Makefile.in (LIBGCOV): Add _gcov_fork, _gcov_execl, _gcov_execlp,
      	_gcov_execle, _gcov_execv, _gcov_execvp, _gcov_execve.
      	* builtin-types.def (BT_PID, BT_PTR_CONST_STRING, BT_FN_PID,
      	BT_FN_INT_CONST_STRING_PTR_CONST_STRING,
      	BT_FN_INT_CONST_STRING_PTR_CONST_STRING_PTR_CONST_STRING): New.
      	* builtins.c (expand_builtin_fork_or_exec): New.
      	(expand_builtin): Call it.
      	* builtins.def (BUILT_IN_EXECL, BUILT_IN_EXECLP,BUILT_IN_EXECLE,
      	BUILT_IN_EXECV, BUILT_IN_EXECVP, BUILT_IN_EXECVE, BUILT_IN_FORK): New.
      	* c-common.c (PID_TYPE): New macro.
      	(c_common_nodes_and_builtins): Initialize pid_type_node.
      	* calls.c (special_function_p): Do not handle fork and exec.
      	(expand_call): Do not handle ECF_FORK_OR_EXEC.
      	* gcov-io.h (__gcov_fork, __gcov_execl, __gcov_execlp, __gcov_execle,
      	__gcov_execv, __gcov_execvp, __gcov_execve): Declare.
      	* libgcov.c (__gcov_fork, __gcov_execl, __gcov_execlp, __gcov_execle,
      	__gcov_execv, __gcov_execvp, __gcov_execve): New.
      	* tree.h (enum tree_index): Add TI_PID_TYPE.
      	(pid_type_node): New macro.
      	(ECF_FORK_OR_EXEC): Removed.
      
      From-SVN: r81118
      d1c38823
  27. Feb 23, 2004
    • Kazu Hirata's avatar
      convert.c, [...]: Update copyright. · 2a9f2ad3
      Kazu Hirata authored
      	* convert.c, gcov-io.c, libgcov.c, sched-int.h, sibcall.c,
      	config/rs6000/linux.h, config/rs6000/rs6000-c.c: Update
      	copyright.
      
      From-SVN: r78318
      2a9f2ad3
  28. Feb 22, 2004
    • Jakub Jelinek's avatar
      gcov-io.c (gcov_open): Use open + fdopen instead of fopen. · c2cd64b5
      Jakub Jelinek authored
      	* gcov-io.c (gcov_open) [GCOV_LOCKED]: Use open + fdopen instead of
      	fopen.
      	* libgcov.c: Include sys/stat.h.
      	* config/rs6000/linux.h (TARGET_HAS_F_SETLKW): Define.
      	* config/rs6000/linux64.h (TARGET_HAS_F_SETLKW): Define.
      	* config/sparc/linux.h (TARGET_HAS_F_SETLKW): Define.
      	* config/sparc/linux64.h (TARGET_HAS_F_SETLKW): Define.
      
      From-SVN: r78281
      c2cd64b5
  29. Sep 29, 2003
  30. Aug 02, 2003
  31. Jul 10, 2003
    • Nathan Sidwell's avatar
      gcov-io.h: Update documentation. · 330d2e2a
      Nathan Sidwell authored
      	* gcov-io.h: Update documentation.
      	(GCOV_UNSIGNED2STRING): New.
      	(GCOV_TAG_FUNCTION_LENGTH, GCOV_TAG_BLOCKS_LENGTH,
      	GCOV_TAG_ARCS_LENGTH, GCOV_TAG_COUNTER_LENGTH,
      	GCOV_TAG_SUMMARY_LENGTH): Adjust.
      	(GCOV_TAG_BLOCKS_NUM, GCOV_TAG_ARCS_NUM,
      	GCOV_TAG_COUNTER_NUM): New.
      	(GCOV_BLOCK_SIZE): Number of words.
      	(gcov_var): Adjust buffer type.
      	* gcov-io.c (gcov_write_bytes, gcov_read_bytes): Rename to ...
      	(gcov_write_words, gcov_read_words): ... here. Take a 4-byte word
      	count, not byte count.
      	(gcov_open): Adjust overread init.
      	(gcov_allocate, gcov_write_unsigned, gcov_write_counter,
      	gcov_write_string, gcov_write_tag, gcov_write_length,
      	gcov_write_tag_length): Adjust.
      	(gcov_read_unsigned, gcov_read_counter, gcov_read_string): Adjust.
      	(gcov_sync, gcov_seek): Adjust.
      	* gcov-dump.c (print_usage): Show gcc version only.
      	(dump_file): Use GCOV_UNSIGNED2STRING.
      	(tag_blocks, tag_arcs, tag_counters): Use GCOV_TAG_*_NUM macros.
      	* gcov.c (print_version): Show gcc version only.
      	(read_graph_file): Use GCOV_UNSIGNED2STRING. Use
      	GCOV_TAG_*_NUM macros.
      	(read_count_file): Use GCOV_UNSIGNED2STRING. Use
      	GCOV_TAG_COUNTER_LENGTH.
      	* coverage.c (read_counts_file): Use GCOV_UNSIGNED2STRING.
      	Use GCOV_TAG_COUNTER_NUM.
      	* libgcov.c (gcov_version): Use GCOV_UNSIGNED2STRING.
      	(__gcov_merge_single, __gcov_merge_delta): Use GCOV_CHECK.
      
      From-SVN: r69188
      330d2e2a
  32. Jul 09, 2003
    • Nathan Sidwell's avatar
      gcov-io.h: Update documentation. · 160e2e4f
      Nathan Sidwell authored
      	* gcov-io.h: Update documentation.
      	(GCOV_GRAPH_SUFFIX, GCOV_GRAPH_MAGIC): Rename to GCOV_NOTE_SUFFIX,
      	GCOV_NOTE_MAGIC.
      	(GCOV_DATA_SUFFIX, GCOV_NOTE_SUFFIX): Update.
      	(GCOV_DATA_MAGIC, GCOV_NOTE_MAGIC): Make non-palindromic.
      	(struct gcov_var): Change buffer's type. Add endian flag.
      	(gcov_open): Remove mode in libgcov.
      	(gcov_magic): Prototype.
      	* gcov-io.c (from_file): New.
      	(gcov_open): Clear endian flag.
      	(gcov_magic): New.
      	(gcov_write_bytes, gcov_read_bytes): Return gcov_unsigned_t
      	pointers.
      	(gcov_write_unsigned, gcov_write_counter, gcov_write_string,
      	gcov_write_tag, gcov_write_length, gcov_write_tag_length): Update.
      	(gcov_read_unsigned, gcov_read_counter, gcov_read_string): Update.
      	* gcov-iov.c (main): Correct cast.
      	* coverage.c (read_counts_file): Use gcov_magic. Remove endianness
      	conversion.
      	(gcov_begin_output): Use GCOV_NOTE_MAGIC.
      	(coverage_init): Use GCOV_NOTE_SUFFIX.
      	* libgcov.c (gcov_version_mismatch): Remove endianness conversion.
      	Rename to gcov_version, and return flag.
      	(gcov_exit): Use gcov_version.
      	(__gcov_init): Use gcov_version.
      	* Makefile.in (coverageexts): Update.
      	* gcov.c (print_version): Remove endianness conversion.
      	(create_file_names): Use GCOV_NOTE_SUFFIX.
      	(read_graph_file): Use gcov_magic.
      	(read_count_file): Likewise.
      	* gcov-dump.c (dump_file): Remove endianness conversion, use
      	gcov_magic.
      
      From-SVN: r69137
      160e2e4f
  33. Jul 06, 2003
    • Nathan Sidwell's avatar
      gcov-io.h: Add a local time stamp. · dd486eb2
      Nathan Sidwell authored
      	* gcov-io.h: Add a local time stamp.
      	(struct gcov_info): Add stamp field.
      	(gcov_truncate): New.
      	* coverage.c (read_counts_file): Skip the stamp.
      	(coverage_begin_output): Write the stamp.
      	(build_gcov_info): Declare and init the stamp.
      	(coverage_finish): Only unlink data file, if stamp is zero.
      	* gcov-dump.c (dump_file): Dump the stamp.
      	* gcov.c (bbg_stamp): New.
      	(release_structures): Clear bbg_stamp.
      	(read_graph_file): Read stamp.
      	(read_count_file): Check stamp.
      	* libgcov.c (gcov_exit): Check stamp and truncate if needed.
      
      From-SVN: r69006
      dd486eb2
  34. Jun 29, 2003
    • Kazu Hirata's avatar
      alloc-pool.c: Fix comment formatting. · f9da5064
      Kazu Hirata authored
      	* alloc-pool.c: Fix comment formatting.
      	* bitmap.c: Likewise.
      	* bitmap.h: Likewise.
      	* bt-load.c: Likewise.
      	* builtins.c: Likewise.
      	* caller-save.c: Likewise.
      	* cfganal.c: Likewise.
      	* cfgrtl.c: Likewise.
      	* collect2.c: Likewise.
      	* cse.c: Likewise.
      	* df.c: Likewise.
      	* diagnostic.c: Likewise.
      	* dwarf2out.c: Likewise.
      	* dwarfout.c: Likewise.
      	* expmed.c: Likewise.
      	* final.c: Likewise.
      	* flags.h: Likewise.
      	* fold-const.c: Likewise.
      	* gcc.c: Likewise.
      	* gcov-io.h: Likewise.
      	* gcov.c: Likewise.
      	* genattrtab.c: Likewise.
      	* genautomata.c: Likewise.
      	* libgcov.c: Likewise.
      	* mips-tfile.c: Likewise.
      	* optabs.c: Likewise.
      	* prefix.c: Likewise.
      	* rtlanal.c: Likewise.
      	* stmt.c: Likewise.
      	* stor-layout.c: Likewise.
      	* toplev.c: Likewise.
      	* varasm.c: Likewise.
      	* vmsdbgout.c: Likewise.
      
      From-SVN: r68672
      f9da5064
  35. Jun 26, 2003
    • Zdenek Dvorak's avatar
      value-prof.c: New. · af166e5d
      Zdenek Dvorak authored
      	* value-prof.c: New.
      	* value-prof.h: New.
      	* Makefile.in (value-prof.o): New.
      	(LIBGCOV): Add _gcov_merge_single and _gcov_merge_delta
      	(profile.o): Add value-prof.h and tree.h dependency.
      	* flags.h (flag_profile_values): Declare.
      	* gcov-io.h (GCOV_COUNTERS, GCOV_COUNTER_NAMES, GCOV_MERGE_FUNCTIONS):
      	Add new counters.
      	(GCOV_COUNTER_V_INTERVAL, GCOV_COUNTER_V_POW2, GCOV_COUNTER_V_SINGLE,
      	GCOV_COUNTER_V_DELTA): New counter sections.
      	(__gcov_merge_single, __gcov_merge_delta): Declare.
      	* flow.c (mark_used_regs): Set subregs_of_mode only when the
      	structure is initialized.
      	* libgcov.c (__gcov_merge_single, __gcov_merge_delta): New functions.
      	* profile.c: Include value-prof.h and tree.h.
      	(gen_interval_profiler, gen_pow2_profiler, gen_one_value_profiler,
      	gen_const_delta_profiler, instrument_values): New static functions.
      	(get_exec_counts): Fix comment.
      	(branch_prob): Invoke instrument_values.
      	* toplev.c (flag_profile_values): New flag.
      	* doc/invoke.texi (-fprofile-values): Document.
      
      From-SVN: r68519
      af166e5d
  36. May 14, 2003
    • Nathan Sidwell's avatar
      gcov-io.h (gcov_write_bytes, [...]): Remove here. · 7d63a2fa
      Nathan Sidwell authored
      	* gcov-io.h (gcov_write_bytes, gcov_read_bytes): Remove here.
      	(GCOV_TAG_*) Force type to gcov_unsigned_t.
      	(GCOV_CHECK, GCOV_CHECK_READING, GCOV_CHECK_WRITING): New.
      	(struct gcov_var): Remove modified. Add start, length, offset,
      	overread. Have buffer array for libgcov.
      	(gcov_sync, gcov_seek): Definitions moved to gcov-io.c.
      	(gcov_position, gcov_rewrite, gcov_is_eof): Adjust.
      	* gcov-io.c (gcov_open): Set mode, do not read anything.
      	(gcov_close): Write final block.
      	 (gcov_write_block, gcov_allocate): New.
      	(gcov_write_bytes): Make static. Write or allocate buffer.
      	(gcov_write_unsigned, gcov_write_counter): Buffer can never be
      	null.
      	(gcov_write_string): Adjust.
      	(gcov_write_tag)
      	(gcov_write_length): Adjust. Flush the block.
      	(gcov_write_tag_length): Buffer can never be null.
      	(gcov_read_bytes): Make static. Read in block.
      	(gcov_sync): Moved here. Adjust.
      	(gcov_seek): Moved here. Adjust.
      	* coverage.c (read_counts_file): Adjust.
      	* gcov-dump.c (print_prefix): Add position parameter.
      	(flag_dump_positions): New flag.
      	(options, main, print_usage): Add it.
      	(dump_file, tag_blocks, tag_arcs, tag_lines, tag_counters,
      	tag_summary): Adjust.
      	* gcov.c (read_graph_file, read_count_file): Adjust.
      	* libgcov.c (gcov_exit): Adjust.
      
      From-SVN: r66805
      7d63a2fa
  37. May 10, 2003
    • Nathan Sidwell's avatar
      defaults.h (GCOV_TYPE_SIZE): Remove. · 9b514d25
      Nathan Sidwell authored
      	* defaults.h (GCOV_TYPE_SIZE): Remove.
      	* gcov-io.h (gcov_type): Set to specific mode int on target.
      	(gcov_unsigned_t, gcov_position_t): New.
      	(GCOV_TYPE_NODE): New.
      	(GCOV_TAG_SUMMARY_LENGTH): Adjust.
      	(GCOV_COUNTERS_SUMMABLE): New.
      	(gcov_ctr_summary, gcov_sumary, gcov_fn_info, gcov_merge_fn,
      	gcov_ctr_info, gcov_info): Adjust types.
      	(gcov_var): Adjust types.
      	(gcov_write_unsigned, gcov_write_tag,
      	gcov_write_length, gcov_write_tag_length, gcov_write_summary,
      	gcov_read_unsigned, gcov_read_summary): Adjust gcov types.
      	(gcov_position, gcov_sync, gcov_seek): Adjust gcov types.
      	* gcov-io.c (gcov_write_unsigned, gcov_write_tag,
      	gcov_write_length, gcov_write_tag_length, gcov_write_summary,
      	gcov_read_unsigned, gcov_read_summary): Adjust gcov types.
      	* libgcov.c (gcov_crc32, gcov_version_mismatch, gcov_exit,
      	__gcov_init, __gcov_merge_add): Adjust gcov types.
      	* coverage.c (ctr_merge_functions): Constify.
      	(ctr_names): New.
      	(read_counts_file): Adjust gcov types. Only summarize & merge
      	summable counters.
      	(coverage_counter_ref): Use GCOV_TYPE_NODE.
      	(build_fn_info_type, build_fn_info_value, build_ctr_info_type,
      	build_ctr_info_value, build_gcov_info): Adjust types.
      	* profile.c (branch_prob): Adjust gcov types.
      	* gcov_dump (dump_file): Adjust gcov types.
      
      From-SVN: r66668
      9b514d25
  38. May 07, 2003
    • Nathan Sidwell's avatar
      gcov-io.h (GCOV_LOCKED): New #define. · 474f141e
      Nathan Sidwell authored
      	* gcov-io.h (GCOV_LOCKED): New #define.
      	(GCOV_LINKAGE): Make sure it is #defined.
      	(gcov_write_string, gcov_write_tag, gcov_write_length,
      	gcov_read_string, gcov_time): Poison in libgcov.
      	(gcov_seek_end): Remove.
      	(gcov_write_tag_length, gcov_sync, gcov_rewrite): New.
      	(GCOV_TAG_FUNCTION_LENGTH, GCOV_TAG_BLOCKS_LENGTH,
      	GCOV_TAG_ARCS_LENGTH, GCOV_TAG_COUNTER_LENGTH,
      	GCOV_TAG_SUMMARY_LENGTH): New #defines.
      	(gcov_write_tag, gcov_write_length): Not in libgcov.
      	* gcov-io.c (gcov_open): Use GCOV_LOCKED.
      	(gcov_write_tag, gcov_write_length): Not in libgcov.
      	(gcov_write_tag_length): New.
      	(gcov_write_summary): Use gcov_write_tag_length.
      	* libgcov.c: Always #include gcov-io.h.
      	(IN_LIBGCOV): -1 for inhibit_libc, +1 otherwise.
      	(GCOV_LINKAGE): Define to nothing for L_gcov.
      	(gcov_exit): Replace gcov_write_tag, gcov_write_length with
      	gcov_write_tag_length. Use gcov_rewrite & gcov_seek.
      	* gcov.c (read_graph_file): Replace gcov_seek by gcov_sync.
      	(read_count_file): Likewise.
      	* gcov-dump.c (dump_file): Likewise.
      	* coverag.c (read_counts_file): Likewise.
      
      From-SVN: r66555
      474f141e
  39. May 05, 2003
Loading