diff --git a/gcc/cp/method.cc b/gcc/cp/method.cc
index 304d11d145c5a8db53d8e65546de5a466da8d645..3914bbb1ef23add53a5d2f6f6ddb08af9a694cee 100644
--- a/gcc/cp/method.cc
+++ b/gcc/cp/method.cc
@@ -1635,6 +1635,18 @@ build_comparison_op (tree fndecl, bool defining, tsubst_flags_t complain)
 	  rettype = common_comparison_type (comps);
 	  apply_deduced_return_type (fndecl, rettype);
 	}
+      tree retvaleq;
+      if (code == EQ_EXPR)
+	retvaleq = boolean_true_node;
+      else
+	{
+	  tree seql = lookup_comparison_result (cc_strong_ordering,
+						"equal", complain);
+	  retvaleq = build_static_cast (input_location, rettype, seql,
+					complain);
+	  if (retvaleq == error_mark_node)
+	    bad = true;
+	}
       if (bad)
 	{
 	  DECL_DELETED_FN (fndecl) = true;
@@ -1722,19 +1734,7 @@ build_comparison_op (tree fndecl, bool defining, tsubst_flags_t complain)
 	    }
 	}
       if (defining)
-	{
-	  tree val;
-	  if (code == EQ_EXPR)
-	    val = boolean_true_node;
-	  else
-	    {
-	      tree seql = lookup_comparison_result (cc_strong_ordering,
-						    "equal", complain);
-	      val = build_static_cast (input_location, rettype, seql,
-				       complain);
-	    }
-	  finish_return_stmt (val);
-	}
+	finish_return_stmt (retvaleq);
     }
   else if (code == NE_EXPR)
     {
diff --git a/gcc/testsuite/g++.dg/cpp2a/spaceship-err6.C b/gcc/testsuite/g++.dg/cpp2a/spaceship-err6.C
index 57fbdb33088438884cfd2bac02d9ad50b03c5918..7e36df3ff9f30c089d3cb64a72e430f2d8219364 100644
--- a/gcc/testsuite/g++.dg/cpp2a/spaceship-err6.C
+++ b/gcc/testsuite/g++.dg/cpp2a/spaceship-err6.C
@@ -10,7 +10,7 @@ class MyClass
 public:
   MyClass(int value): mValue(value) {}
 
-  bool operator<=>(const MyClass&) const = default;
+  bool operator<=>(const MyClass&) const = default;	// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'bool'" }
 };
 
 int main()
diff --git a/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg6.C b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg6.C
index d3f95e13f135469e332e204dc1e2b3fe459bdf60..f4df61ed50884873c8c95facc101f671a69017c6 100644
--- a/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg6.C
+++ b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg6.C
@@ -5,7 +5,7 @@
 
 struct S {
   int a;			// { dg-error "three-way comparison of 'S::a' has type 'std::strong_ordering', which does not convert to 'int\\*'" }
-  int *operator<=>(const S&) const = default;
+  int *operator<=>(const S&) const = default;	// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'int\\*'" }
 };
 
 bool b = S{} < S{};		// { dg-error "use of deleted function 'constexpr int\\* S::operator<=>\\\(const S&\\\) const'" }
diff --git a/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg7.C b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg7.C
new file mode 100644
index 0000000000000000000000000000000000000000..f3ef9fe13c07a50d62cf6d2acbf76e6d09ffa12f
--- /dev/null
+++ b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth-neg7.C
@@ -0,0 +1,58 @@
+// PR c++/118387
+// { dg-do compile { target c++20 } }
+
+#include <compare>
+
+struct A {
+  int operator<=> (const A &) const;
+};
+
+struct B {
+  A a;
+  int operator<=> (const B &) const = default;	// { dg-message "'constexpr int B::operator<=>\\\(const B&\\\) const' is implicitly deleted because the default definition would be ill-formed:" }
+};			// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'int'" "" { target *-*-* } .-1 }
+
+struct C {
+  int operator<=> (const C &) const = default;	// { dg-message "'constexpr int C::operator<=>\\\(const C&\\\) const' is implicitly deleted because the default definition would be ill-formed:" }
+};			// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'int'" "" { target *-*-* } .-1 }
+
+struct D {
+  auto operator<=> (const D &) const = default;
+};
+
+struct E {
+  D a;			// { dg-error "three-way comparison of 'E::a' has type 'std::strong_ordering', which does not convert to 'int'" }
+  int operator<=> (const E &) const = default;	// { dg-message "'constexpr int E::operator<=>\\\(const E&\\\) const' is implicitly deleted because the default definition would be ill-formed:" }
+};			// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'int'" "" { target *-*-* } .-1 }
+
+struct F {
+  A a;
+  int operator<=> (const F &) const = default;
+};
+
+struct G {
+  int operator<=> (const G &) const = default;
+};
+
+struct H {
+  D a;
+  int operator<=> (const H &) const = default;
+};
+
+auto
+foo (B a, B b)
+{
+  return a <=> b;	// { dg-error "use of deleted function 'constexpr int B::operator<=>\\\(const B&\\\) const'" }
+}
+
+auto
+bar (C a, C b)
+{
+  return a <=> b;	// { dg-error "use of deleted function 'constexpr int C::operator<=>\\\(const C&\\\) const'" }
+}
+
+auto
+baz (E a, E b)
+{
+  return a <=> b;	// { dg-error "use of deleted function 'constexpr int E::operator<=>\\\(const E&\\\) const'" }
+}
diff --git a/gcc/testsuite/g++.dg/cpp2a/spaceship-synth17.C b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth17.C
index a7793314ce1ebdf573746197c95635f6ec5d2ec5..050ea330db0d579f8783e60df6c229f230697536 100644
--- a/gcc/testsuite/g++.dg/cpp2a/spaceship-synth17.C
+++ b/gcc/testsuite/g++.dg/cpp2a/spaceship-synth17.C
@@ -8,7 +8,7 @@ struct B {};
 struct A
 {
   B b;			// { dg-error "no match for 'operator<=>' in '\[^\n\r]*' \\\(operand types are 'B' and 'B'\\\)" }
-  int operator<=> (const A &) const = default;
+  int operator<=> (const A &) const = default;	// { dg-error "invalid 'static_cast' from type 'const std::strong_ordering' to type 'int'" }
 };
 
 int
diff --git a/libstdc++-v3/testsuite/25_algorithms/default_template_value.cc b/libstdc++-v3/testsuite/25_algorithms/default_template_value.cc
index 3cf51bc087b4add9a90508e170654a0cdae337ae..b05234e1f8dfb396d772c6d83ebd8ea9a73ac681 100644
--- a/libstdc++-v3/testsuite/25_algorithms/default_template_value.cc
+++ b/libstdc++-v3/testsuite/25_algorithms/default_template_value.cc
@@ -27,7 +27,7 @@ struct Output
 struct Input
 {
   Input(int, double);
-  friend bool operator<=>(const Input &, const Input &) = default;
+  friend auto operator<=>(const Input &, const Input &) = default;
   friend Input operator+(const Input &, const Input &);
   operator Output() const;
 };