diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index cc8816cb2af892b0a4adb4914c73471aafe621bd..862e2bf72744ca5819516a0c251988cb5cf47cb0 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,18 @@
+2006-05-17  Jakub Jelinek  <jakub@redhat.com>
+
+	PR middle-end/27415
+	* tree.h (OMP_PARALLEL_COMBINED): Define.
+	* gimplify.c (struct gimplify_omp_ctx): Add is_combined_parallel field.
+	(new_omp_context): Add is_combined_parallel argument.
+	(gimplify_scan_omp_clauses): Add in_combined_parallel argument, adjust
+	new_omp_context caller.
+	(gimplify_omp_parallel, gimplify_omp_for, gimplify_omp_workshare):
+	Adjust gimplify_scan_omp_clauses callers.
+	(omp_is_private): Issue errors if iteration variable is firstprivate
+	or reduction in the current context.
+	* c-parser.c (c_parser_omp_parallel): Set OMP_PARALLEL_COMBINED
+	on combined parallel workshare constructs.
+
 2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
 
 	* Makefile.in (GCC_OBJS): Replace options.o with gcc-options.o.
diff --git a/gcc/c-parser.c b/gcc/c-parser.c
index aad1c6bb048058868c6eb236e7c5a502d9e37163..8f6cafda28486e318771b8add1b198a4e4a4e8a0 100644
--- a/gcc/c-parser.c
+++ b/gcc/c-parser.c
@@ -7651,6 +7651,7 @@ c_parser_omp_parallel (c_parser *parser)
       if (stmt)
 	OMP_FOR_CLAUSES (stmt) = ws_clause;
       stmt = c_finish_omp_parallel (par_clause, block);
+      OMP_PARALLEL_COMBINED (stmt) = 1;
       break;
 
     case PRAGMA_OMP_PARALLEL_SECTIONS:
@@ -7660,6 +7661,7 @@ c_parser_omp_parallel (c_parser *parser)
       if (stmt)
 	OMP_SECTIONS_CLAUSES (stmt) = ws_clause;
       stmt = c_finish_omp_parallel (par_clause, block);
+      OMP_PARALLEL_COMBINED (stmt) = 1;
       break;
 
     default:
diff --git a/gcc/cp/ChangeLog b/gcc/cp/ChangeLog
index 698ae1a58dcc2604dc9d644e213ed4f9e30c9eb2..8a318578fb3d93c6121b3642fdcdd415e1ce1663 100644
--- a/gcc/cp/ChangeLog
+++ b/gcc/cp/ChangeLog
@@ -1,3 +1,10 @@
+2006-05-17  Jakub Jelinek  <jakub@redhat.com>
+
+	PR middle-end/27415
+	* parser.c (cp_parser_omp_parallel): Set OMP_PARALLEL_COMBINED
+	on combined parallel workshare constructs.
+	* pt.c (tsubst_expr): Copy OMP_PARALLEL_COMBINED flag.
+
 2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
 
 	PR driver/26885
diff --git a/gcc/cp/parser.c b/gcc/cp/parser.c
index c89c357e200cc98368e28e39fc89c028b4a68bf7..28c5007dafce60b1bd886092debbf4100ac460ae 100644
--- a/gcc/cp/parser.c
+++ b/gcc/cp/parser.c
@@ -18842,7 +18842,10 @@ cp_parser_omp_parallel (cp_parser *parser, cp_token *pragma_tok)
     }
 
   cp_parser_end_omp_structured_block (parser, save);
-  return finish_omp_parallel (par_clause, block);
+  stmt = finish_omp_parallel (par_clause, block);
+  if (p_kind != PRAGMA_OMP_PARALLEL)
+    OMP_PARALLEL_COMBINED (stmt) = 1;
+  return stmt;
 }
 
 /* OpenMP 2.5:
diff --git a/gcc/cp/pt.c b/gcc/cp/pt.c
index 7bbc2cc972fd9d5758afa2146553c71939dc8573..ea3ff411b8ddac9c641218ce1cd849c92aafe381 100644
--- a/gcc/cp/pt.c
+++ b/gcc/cp/pt.c
@@ -8456,7 +8456,8 @@ tsubst_expr (tree t, tree args, tsubst_flags_t complain, tree in_decl)
 				args, complain, in_decl);
       stmt = begin_omp_parallel ();
       tsubst_expr (OMP_PARALLEL_BODY (t), args, complain, in_decl);
-      finish_omp_parallel (tmp, stmt);
+      OMP_PARALLEL_COMBINED (finish_omp_parallel (tmp, stmt))
+	= OMP_PARALLEL_COMBINED (t);
       break;
 
     case OMP_FOR:
diff --git a/gcc/fortran/ChangeLog b/gcc/fortran/ChangeLog
index f07af3b0a5f2c5f29331b0568b25afd2a9a22940..2e4f8fb3eb189109195238ffe16528288b168197 100644
--- a/gcc/fortran/ChangeLog
+++ b/gcc/fortran/ChangeLog
@@ -1,3 +1,10 @@
+2006-05-17  Jakub Jelinek  <jakub@redhat.com>
+
+	PR middle-end/27415
+	* trans-openmp.c (gfc_trans_omp_parallel_do,
+	gfc_trans_omp_parallel_sections, gfc_trans_omp_parallel_workshare): Set
+	OMP_PARALLEL_COMBINED flag.
+
 2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
 
 	PR driver/26885
diff --git a/gcc/fortran/trans-openmp.c b/gcc/fortran/trans-openmp.c
index f33f1bd374104fff20e3184fc01f75894647e91a..b7c6f9e3bfb9fd245843855b83361335a634964e 100644
--- a/gcc/fortran/trans-openmp.c
+++ b/gcc/fortran/trans-openmp.c
@@ -1095,6 +1095,7 @@ gfc_trans_omp_parallel_do (gfc_code *code)
   else
     poplevel (0, 0, 0);
   stmt = build4_v (OMP_PARALLEL, stmt, omp_clauses, NULL, NULL);
+  OMP_PARALLEL_COMBINED (stmt) = 1;
   gfc_add_expr_to_block (&block, stmt);
   return gfc_finish_block (&block);
 }
@@ -1119,6 +1120,7 @@ gfc_trans_omp_parallel_sections (gfc_code *code)
   else
     poplevel (0, 0, 0);
   stmt = build4_v (OMP_PARALLEL, stmt, omp_clauses, NULL, NULL);
+  OMP_PARALLEL_COMBINED (stmt) = 1;
   gfc_add_expr_to_block (&block, stmt);
   return gfc_finish_block (&block);
 }
@@ -1143,6 +1145,7 @@ gfc_trans_omp_parallel_workshare (gfc_code *code)
   else
     poplevel (0, 0, 0);
   stmt = build4_v (OMP_PARALLEL, stmt, omp_clauses, NULL, NULL);
+  OMP_PARALLEL_COMBINED (stmt) = 1;
   gfc_add_expr_to_block (&block, stmt);
   return gfc_finish_block (&block);
 }
diff --git a/gcc/gimplify.c b/gcc/gimplify.c
index 279bd2b3ac211008d0b4644dde38e2688e29dc2a..a4389741e23dbe198defdfc892c54ec3e547ea06 100644
--- a/gcc/gimplify.c
+++ b/gcc/gimplify.c
@@ -73,6 +73,7 @@ struct gimplify_omp_ctx
   location_t location;
   enum omp_clause_default_kind default_kind;
   bool is_parallel;
+  bool is_combined_parallel;
 };
 
 struct gimplify_ctx
@@ -259,7 +260,7 @@ splay_tree_compare_decl_uid (splay_tree_key xa, splay_tree_key xb)
 /* Create a new omp construct that deals with variable remapping.  */
 
 static struct gimplify_omp_ctx *
-new_omp_context (bool is_parallel)
+new_omp_context (bool is_parallel, bool is_combined_parallel)
 {
   struct gimplify_omp_ctx *c;
 
@@ -269,6 +270,7 @@ new_omp_context (bool is_parallel)
   c->privatized_types = pointer_set_create ();
   c->location = input_location;
   c->is_parallel = is_parallel;
+  c->is_combined_parallel = is_combined_parallel;
   c->default_kind = OMP_CLAUSE_DEFAULT_SHARED;
 
   return c;
@@ -4452,6 +4454,18 @@ omp_is_private (struct gimplify_omp_ctx *ctx, tree decl)
 	  else
 	    return false;
 	}
+      else if ((n->value & GOVD_EXPLICIT) != 0
+	       && (ctx == gimplify_omp_ctxp
+		   || (ctx->is_combined_parallel
+		       && gimplify_omp_ctxp->outer_context == ctx)))
+	{
+	  if ((n->value & GOVD_FIRSTPRIVATE) != 0)
+	    error ("iteration variable %qs should not be firstprivate",
+		   IDENTIFIER_POINTER (DECL_NAME (decl)));
+	  else if ((n->value & GOVD_REDUCTION) != 0)
+	    error ("iteration variable %qs should not be reduction",
+		   IDENTIFIER_POINTER (DECL_NAME (decl)));
+	}
       return true;
     }
 
@@ -4467,12 +4481,13 @@ omp_is_private (struct gimplify_omp_ctx *ctx, tree decl)
    and previous omp contexts.  */
 
 static void
-gimplify_scan_omp_clauses (tree *list_p, tree *pre_p, bool in_parallel)
+gimplify_scan_omp_clauses (tree *list_p, tree *pre_p, bool in_parallel,
+			   bool in_combined_parallel)
 {
   struct gimplify_omp_ctx *ctx, *outer_ctx;
   tree c;
 
-  ctx = new_omp_context (in_parallel);
+  ctx = new_omp_context (in_parallel, in_combined_parallel);
   outer_ctx = ctx->outer_context;
 
   while ((c = *list_p) != NULL)
@@ -4717,7 +4732,8 @@ gimplify_omp_parallel (tree *expr_p, tree *pre_p)
 {
   tree expr = *expr_p;
 
-  gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p, true);
+  gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p, true,
+			     OMP_PARALLEL_COMBINED (expr));
 
   push_gimplify_context ();
 
@@ -4743,7 +4759,7 @@ gimplify_omp_for (tree *expr_p, tree *pre_p)
 
   for_stmt = *expr_p;
 
-  gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, false);
+  gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, false, false);
 
   t = OMP_FOR_INIT (for_stmt);
   gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
@@ -4825,7 +4841,7 @@ gimplify_omp_workshare (tree *expr_p, tree *pre_p)
 {
   tree stmt = *expr_p;
 
-  gimplify_scan_omp_clauses (&OMP_CLAUSES (stmt), pre_p, false);
+  gimplify_scan_omp_clauses (&OMP_CLAUSES (stmt), pre_p, false, false);
   gimplify_to_stmt_list (&OMP_BODY (stmt));
   gimplify_adjust_omp_clauses (&OMP_CLAUSES (stmt));
 
diff --git a/gcc/testsuite/ChangeLog b/gcc/testsuite/ChangeLog
index efcbdfa946940147924057d6d4caeecebbe40ff0..b5339b2ec1b8b92030c332a46113c9b5f7faff09 100644
--- a/gcc/testsuite/ChangeLog
+++ b/gcc/testsuite/ChangeLog
@@ -1,3 +1,9 @@
+2006-05-17  Jakub Jelinek  <jakub@redhat.com>
+
+	PR middle-end/27415
+	* gcc.dg/gomp/pr27415.c: New test.
+	* g++.dg/gomp/pr27415.C: New test.
+
 2006-05-17  Jakub Jelinek  <jakub@redhat.com>
 
 	PR tree-optimization/27549
diff --git a/gcc/testsuite/g++.dg/gomp/pr27415.C b/gcc/testsuite/g++.dg/gomp/pr27415.C
new file mode 100644
index 0000000000000000000000000000000000000000..81f0ed5c6b7bc163283683a0b2cf990cb8f53398
--- /dev/null
+++ b/gcc/testsuite/g++.dg/gomp/pr27415.C
@@ -0,0 +1,50 @@
+// PR middle-end/27415
+// { dg-do compile }
+
+void
+test1 (void)
+{
+  int i = 0;
+#pragma omp parallel
+#pragma omp for firstprivate (i)		// { dg-error "should not be firstprivate" }
+  for (i = 0; i < 10; i++)
+    ;
+}
+
+void
+test2 (void)
+{
+  int i = 0;
+#pragma omp parallel for firstprivate (i)
+  for (i = 0; i < 10; i++)			// { dg-error "should not be firstprivate" }
+    ;
+}
+
+void
+test3 (void)
+{
+  int i = 0;
+#pragma omp parallel
+#pragma omp for reduction (+:i)			// { dg-error "should not be reduction" }
+  for (i = 0; i < 10; i++)
+    ;
+}
+
+void
+test4 (void)
+{
+  int i = 0;
+#pragma omp parallel for reduction (*:i)
+  for (i = 0; i < 10; i++)			// { dg-error "should not be reduction" }
+    ;
+}
+
+void
+test5 (void)
+{
+  int i = 0;
+#pragma omp parallel firstprivate (i)
+#pragma omp for
+  for (i = 0; i < 10; i++)
+    ;
+}
diff --git a/gcc/testsuite/gcc.dg/gomp/pr27415.c b/gcc/testsuite/gcc.dg/gomp/pr27415.c
new file mode 100644
index 0000000000000000000000000000000000000000..418eaf678e986664b7d556e4ebc28c153f7ce334
--- /dev/null
+++ b/gcc/testsuite/gcc.dg/gomp/pr27415.c
@@ -0,0 +1,50 @@
+/* PR middle-end/27415 */
+/* { dg-do compile } */
+
+void
+test1 (void)
+{
+  int i = 0;
+#pragma omp parallel
+#pragma omp for firstprivate (i)		/* { dg-error "should not be firstprivate" } */
+  for (i = 0; i < 10; i++)
+    ;
+}
+
+void
+test2 (void)
+{
+  int i = 0;
+#pragma omp parallel for firstprivate (i)
+  for (i = 0; i < 10; i++)			/* { dg-error "should not be firstprivate" } */
+    ;
+}
+
+void
+test3 (void)
+{
+  int i = 0;
+#pragma omp parallel
+#pragma omp for reduction (+:i)			/* { dg-error "should not be reduction" } */
+  for (i = 0; i < 10; i++)
+    ;
+}
+
+void
+test4 (void)
+{
+  int i = 0;
+#pragma omp parallel for reduction (*:i)
+  for (i = 0; i < 10; i++)			/* { dg-error "should not be reduction" } */
+    ;
+}
+
+void
+test5 (void)
+{
+  int i = 0;
+#pragma omp parallel firstprivate (i)
+#pragma omp for
+  for (i = 0; i < 10; i++)
+    ;
+}
diff --git a/gcc/tree.h b/gcc/tree.h
index 7a4ee33346a6811684559924bd0be821ef0394be..55a5d8f8618c1adb946dcda0b18ffc9326a47ef0 100644
--- a/gcc/tree.h
+++ b/gcc/tree.h
@@ -443,6 +443,8 @@ struct tree_common GTY(())
 	   OMP_RETURN
        OMP_SECTION_LAST in
 	   OMP_SECTION
+       OMP_PARALLEL_COMBINED in
+	   OMP_PARALLEL
 
    protected_flag:
 
@@ -1583,6 +1585,11 @@ struct tree_constructor GTY(())
 #define OMP_RETURN_NOWAIT(NODE) \
   TREE_PRIVATE (OMP_RETURN_CHECK (NODE))
 
+/* True on an OMP_PARALLEL statement if it represents an explicit
+   combined parallel work-sharing constructs.  */
+#define OMP_PARALLEL_COMBINED(NODE) \
+  TREE_PRIVATE (OMP_PARALLEL_CHECK (NODE))
+
 /* True on a PRIVATE clause if its decl is kept around for debugging
    information only and its DECL_VALUE_EXPR is supposed to point
    to what it has been remapped to.  */