diff --git a/ghc/tests/typecheck/should_run/tcrun003.hs b/ghc/tests/typecheck/should_run/tcrun003.hs
new file mode 100644
index 0000000000000000000000000000000000000000..86eb318f1b9a3487de8e00862c415189321fe952
--- /dev/null
+++ b/ghc/tests/typecheck/should_run/tcrun003.hs
@@ -0,0 +1,26 @@
+--!!! One method class from Sergey Mechveliani 
+--    showed up problematic newtype dict rep.
+module Main where
+import Ratio 
+
+class MBConvertible a b  where  cm :: a -> b -> Maybe b
+
+c :: MBConvertible a b => a -> b -> b
+c                         a    b =  case  cm a b  
+                                    of 
+                                      Just b' -> b'
+                                      _       -> error "c a b  failed"
+
+
+instance MBConvertible Int Int  where  cm a _ = Just a
+
+instance (MBConvertible a b,Integral b) => MBConvertible a (Ratio b)
+  where
+  cm a f =  case  cm a (numerator f)  of  Just a' -> Just (a'%1)
+                                          _       -> Nothing 
+  
+main =  let  f  = 1%1 :: Ratio Int
+             n2 = 2::Int
+             g  = (c n2 f) + f
+        in
+             putStr (shows g "\n")
diff --git a/ghc/tests/typecheck/should_run/tcrun003.stdout b/ghc/tests/typecheck/should_run/tcrun003.stdout
new file mode 100644
index 0000000000000000000000000000000000000000..14896f2f713c9d5173e126594163b56d1c1af35d
--- /dev/null
+++ b/ghc/tests/typecheck/should_run/tcrun003.stdout
@@ -0,0 +1 @@
+3 % 1