diff --git a/ghc/tests/concurrent/should_run/conc013.hs b/ghc/tests/concurrent/should_run/conc013.hs
new file mode 100644
index 0000000000000000000000000000000000000000..78c07a9884b62dc277e6ea52427c99c32d7398ba
--- /dev/null
+++ b/ghc/tests/concurrent/should_run/conc013.hs
@@ -0,0 +1,10 @@
+module Main where
+
+-- !!! test Eq and Ord instances over thread Ids.
+
+import Concurrent
+
+main = do
+  tso1 <- forkIO (return ())
+  tso2 <- forkIO (return ())
+  print [compare tso1 tso2, compare tso1 tso1, compare tso2 tso1]
diff --git a/ghc/tests/concurrent/should_run/conc013.stdout b/ghc/tests/concurrent/should_run/conc013.stdout
new file mode 100644
index 0000000000000000000000000000000000000000..98ab9c11f29076af5e71ace5554900f0592f5025
--- /dev/null
+++ b/ghc/tests/concurrent/should_run/conc013.stdout
@@ -0,0 +1 @@
+[LT,EQ,GT]