From 53b8a7107e6c6a774d5e69b8fd5ce46e94c35adb Mon Sep 17 00:00:00 2001
From: Richard Biener <rguenther@suse.de>
Date: Wed, 24 Oct 2018 09:42:19 +0000
Subject: [PATCH] re PR tree-optimization/84013 (wrong __restrict clique with
 inline asm operand)

2018-10-24  Richard Biener  <rguenther@suse.de>

	PR tree-optimization/84013
	* tree-ssa-structalias.c (struct msdi_data): New struct for
	marshalling data to walk_stmt_load_store_ops.
	(maybe_set_dependence_info): Refactor as callback for
	walk_stmt_load_store_ops.
	(compute_dependence_clique): Set restrict info on all stmt kinds.

	* gcc.dg/tree-ssa/restrict-9.c: New testcase.

From-SVN: r265455
---
 gcc/ChangeLog                              |  9 ++++
 gcc/testsuite/ChangeLog                    |  5 +++
 gcc/testsuite/gcc.dg/tree-ssa/restrict-9.c | 16 +++++++
 gcc/tree-ssa-structalias.c                 | 50 +++++++++++-----------
 4 files changed, 55 insertions(+), 25 deletions(-)
 create mode 100644 gcc/testsuite/gcc.dg/tree-ssa/restrict-9.c

diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index e5f43678eec3..92402775ca48 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,12 @@
+2018-10-24  Richard Biener  <rguenther@suse.de>
+
+	PR tree-optimization/84013
+	* tree-ssa-structalias.c (struct msdi_data): New struct for
+	marshalling data to walk_stmt_load_store_ops.
+	(maybe_set_dependence_info): Refactor as callback for
+	walk_stmt_load_store_ops.
+	(compute_dependence_clique): Set restrict info on all stmt kinds.
+
 2018-10-24  Martin Liska  <mliska@suse.cz>
 
 	* cgraph.c (cgraph_node::dump):
diff --git a/gcc/testsuite/ChangeLog b/gcc/testsuite/ChangeLog
index fd437f58a13e..c17488a87c0e 100644
--- a/gcc/testsuite/ChangeLog
+++ b/gcc/testsuite/ChangeLog
@@ -1,3 +1,8 @@
+2018-10-24  Richard Biener  <rguenther@suse.de>
+
+	PR tree-optimization/84013
+	* gcc.dg/tree-ssa/restrict-9.c: New testcase.
+
 2018-10-24  Richard Biener  <rguenther@suse.de>
 
 	PR tree-optimization/87665
diff --git a/gcc/testsuite/gcc.dg/tree-ssa/restrict-9.c b/gcc/testsuite/gcc.dg/tree-ssa/restrict-9.c
new file mode 100644
index 000000000000..bc7f63512d05
--- /dev/null
+++ b/gcc/testsuite/gcc.dg/tree-ssa/restrict-9.c
@@ -0,0 +1,16 @@
+/* { dg-do compile } */
+/* { dg-options "-O2 -fdump-tree-optimized-alias" } */
+
+int *abc(int** __restrict a, int** __restrict b)
+{
+  *a = 0;                     // clique 1 base 1
+  asm volatile("":"+m"(*b));  // clique 0 base 0 (wrong)
+  *a = 0;                     // clique 1 base 1
+  return *b;                  // clique 1 base 2 (what it should be)
+}
+
+/* { dg-final { scan-tree-dump-times "clique 1 base \[12\]" 5 "optimized" } } */
+/* On RTL we can DSE one of the stores of zero, on the GIMPLE level we
+   do not bother to do disambiguation against asms.  */
+/* { dg-final { scan-tree-dump-times " = 0;" 1 "optimized" { xfail *-*-* } } } */
+/* { dg-final { scan-assembler-times "mov\[^\n\r\]*0" 1 { target { x86_64-*-* i?86-*-* } } } } */
diff --git a/gcc/tree-ssa-structalias.c b/gcc/tree-ssa-structalias.c
index 77518031a718..fc85e9ded5e8 100644
--- a/gcc/tree-ssa-structalias.c
+++ b/gcc/tree-ssa-structalias.c
@@ -7466,33 +7466,40 @@ visit_loadstore (gimple *, tree base, tree ref, void *data)
   return false;
 }
 
-/* If REF is a MEM_REF then assign a clique, base pair to it, updating
-   CLIQUE, *RESTRICT_VAR and LAST_RUID.  Return whether dependence info
-   was assigned to REF.  */
+struct msdi_data {
+  tree ptr;
+  unsigned short *clique;
+  unsigned short *last_ruid;
+  varinfo_t restrict_var;
+};
+
+/* If BASE is a MEM_REF then assign a clique, base pair to it, updating
+   CLIQUE, *RESTRICT_VAR and LAST_RUID as passed via DATA.
+   Return whether dependence info was assigned to BASE.  */
 
 static bool
-maybe_set_dependence_info (tree ref, tree ptr,
-			   unsigned short &clique, varinfo_t restrict_var,
-			   unsigned short &last_ruid)
+maybe_set_dependence_info (gimple *, tree base, tree, void *data)
 {
-  while (handled_component_p (ref))
-    ref = TREE_OPERAND (ref, 0);
-  if ((TREE_CODE (ref) == MEM_REF
-       || TREE_CODE (ref) == TARGET_MEM_REF)
-      && TREE_OPERAND (ref, 0) == ptr)
+  tree ptr = ((msdi_data *)data)->ptr;
+  unsigned short &clique = *((msdi_data *)data)->clique;
+  unsigned short &last_ruid = *((msdi_data *)data)->last_ruid;
+  varinfo_t restrict_var = ((msdi_data *)data)->restrict_var;
+  if ((TREE_CODE (base) == MEM_REF
+       || TREE_CODE (base) == TARGET_MEM_REF)
+      && TREE_OPERAND (base, 0) == ptr)
     {
       /* Do not overwrite existing cliques.  This avoids overwriting dependence
 	 info inlined from a function with restrict parameters inlined
 	 into a function with restrict parameters.  This usually means we
 	 prefer to be precise in innermost loops.  */
-      if (MR_DEPENDENCE_CLIQUE (ref) == 0)
+      if (MR_DEPENDENCE_CLIQUE (base) == 0)
 	{
 	  if (clique == 0)
 	    clique = ++cfun->last_clique;
 	  if (restrict_var->ruid == 0)
 	    restrict_var->ruid = ++last_ruid;
-	  MR_DEPENDENCE_CLIQUE (ref) = clique;
-	  MR_DEPENDENCE_BASE (ref) = restrict_var->ruid;
+	  MR_DEPENDENCE_CLIQUE (base) = clique;
+	  MR_DEPENDENCE_BASE (base) = restrict_var->ruid;
 	  return true;
 	}
     }
@@ -7565,18 +7572,11 @@ compute_dependence_clique (void)
 	  imm_use_iterator ui;
 	  gimple *use_stmt;
 	  bool used = false;
+	  msdi_data data = { ptr, &clique, &last_ruid, restrict_var };
 	  FOR_EACH_IMM_USE_STMT (use_stmt, ui, ptr)
-	    {
-	      /* ???  Calls and asms.  */
-	      if (!gimple_assign_single_p (use_stmt))
-		continue;
-	      used |= maybe_set_dependence_info (gimple_assign_lhs (use_stmt),
-						 ptr, clique, restrict_var,
-						 last_ruid);
-	      used |= maybe_set_dependence_info (gimple_assign_rhs1 (use_stmt),
-						 ptr, clique, restrict_var,
-						 last_ruid);
-	    }
+	    used |= walk_stmt_load_store_ops (use_stmt, &data,
+					      maybe_set_dependence_info,
+					      maybe_set_dependence_info);
 	  if (used)
 	    {
 	      bitmap_set_bit (rvars, restrict_var->id);
-- 
GitLab