Skip to content
Snippets Groups Projects
Commit 9452ef06 authored by Tom de Vries's avatar Tom de Vries Committed by Tom de Vries
Browse files

Add debug msg to dump_file in add_new_function

2015-06-08  Tom de Vries  <tom@codesourcery.com>

	PR tree-optimization/66435
	* cgraphunit.c (cgraph_node::add_new_function): Dump message on new
	function.

	* gcc.dg/gomp/notify-new-function-2.c: New test.
	* gcc.dg/gomp/notify-new-function-3.c: Same.
	* gcc.dg/gomp/notify-new-function.c: Same.

From-SVN: r224209
parent bd75ff94
No related branches found
No related tags found
No related merge requests found
2015-06-08 Tom de Vries <tom@codesourcery.com>
PR tree-optimization/66435
* cgraphunit.c (cgraph_node::add_new_function): Dump message on new
function.
2015-06-06 Jan Hubicka <hubicka@ucw.cz> 2015-06-06 Jan Hubicka <hubicka@ucw.cz>
   
* alias.c (get_alias_set): Be ready for TYPE_CANONICAL * alias.c (get_alias_set): Be ready for TYPE_CANONICAL
......
...@@ -507,6 +507,23 @@ cgraph_node::add_new_function (tree fndecl, bool lowered) ...@@ -507,6 +507,23 @@ cgraph_node::add_new_function (tree fndecl, bool lowered)
{ {
gcc::pass_manager *passes = g->get_passes (); gcc::pass_manager *passes = g->get_passes ();
cgraph_node *node; cgraph_node *node;
if (dump_file)
{
struct function *fn = DECL_STRUCT_FUNCTION (fndecl);
const char *function_type = ((gimple_has_body_p (fndecl))
? (lowered
? (gimple_in_ssa_p (fn)
? "ssa gimple"
: "low gimple")
: "high gimple")
: "to-be-gimplified");
fprintf (dump_file,
"Added new %s function %s to callgraph\n",
function_type,
fndecl_name (fndecl));
}
switch (symtab->state) switch (symtab->state)
{ {
case PARSING: case PARSING:
......
2015-06-08 Tom de Vries <tom@codesourcery.com>
PR tree-optimization/66435
* gcc.dg/gomp/notify-new-function-2.c: New test.
* gcc.dg/gomp/notify-new-function-3.c: Same.
* gcc.dg/gomp/notify-new-function.c: Same.
2015-06-06 Jan Hubicka <hubicka@ucw.cz> 2015-06-06 Jan Hubicka <hubicka@ucw.cz>
* gfortran.dg/lto/bind_c-1_0.f90: New testcase. * gfortran.dg/lto/bind_c-1_0.f90: New testcase.
......
/* { dg-do compile } */
/* { dg-options "-O2 -fopenmp -fdump-tree-omplower" } */
void __attribute__((noinline))
baz (int *p)
{
}
void
foo (void)
{
int p[2];
p[0] = 1;
p[1] = 3;
#pragma omp task firstprivate (p)
baz (p);
}
/* Check for new function notification in omplower dump. */
/* { dg-final { scan-tree-dump-times "Added new high gimple function foo\\._omp_cpyfn\\.1 to callgraph" 1 "omplower" } } */
/* { dg-do compile } */
/* { dg-options "-O2 -ftree-parallelize-loops=2 -fdump-tree-ompexpssa" } */
void
foo (int *__restrict a, int *__restrict b, int *__restrict c)
{
int i;
for (i = 0; i < 1000; ++i)
c[i] = a[i] + b[i];
}
/* Check for new function notification in ompexpssa dump. */
/* { dg-final { scan-tree-dump-times "Added new ssa gimple function foo\\._loopfn\\.0 to callgraph" 1 "ompexpssa" } } */
/* { dg-do compile } */
/* { dg-options "-O2 -fopenmp -fdump-tree-ompexp" } */
int
main (void)
{
#pragma omp parallel
{
extern void foo (void);
foo ();
}
return 0;
}
/* Check for new function notification in ompexp dump. */
/* { dg-final { scan-tree-dump-times "Added new low gimple function main\\._omp_fn\\.0 to callgraph" 1 "ompexp" } } */
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment