diff --git a/testsuite/tests/typecheck/should_compile/T16832.hs b/testsuite/tests/typecheck/should_compile/T16832.hs
index 8dcd40fe68d82859f4754175930e77f037062eb3..052a821c9b25d469b6babbdea784c5fb5de64e5e 100644
--- a/testsuite/tests/typecheck/should_compile/T16832.hs
+++ b/testsuite/tests/typecheck/should_compile/T16832.hs
@@ -9,21 +9,22 @@
 
 module WorkingGenerics where
 import GHC.Generics
+import Data.Kind
 
--- type family DiffT (p :: * -> *) :: * -> *
+-- type family DiffT (p :: Type -> Type) :: Type -> Type
 
 data Void  deriving(Generic)
 
 class Diff a  where
-  type family Patch a :: *
+  type family Patch a :: Type
   type Patch a = GPatch (Rep a) a
 
   diff :: a -> a -> Patch a
   default diff :: (Generic a, GDiff (Rep a), Patch a ~ (GPatch (Rep a)) a) => a -> a -> Patch a
   diff a a' = gdiff (from a) (from a')
 
-class GDiff (gen :: * -> *)  where
-  type family GPatch gen :: * -> *
+class GDiff (gen :: Type -> Type)  where
+  type family GPatch gen :: Type -> Type
   gdiff :: gen a -> gen a -> (GPatch gen) a
 
 instance GDiff V1 where
diff --git a/testsuite/tests/typecheck/should_compile/all.T b/testsuite/tests/typecheck/should_compile/all.T
index 244aaa2ec471b71bce8ea9a1fd328a1de7b089ae..9f5a976b9654635a9ff97f2188dc565818d3dd72 100644
--- a/testsuite/tests/typecheck/should_compile/all.T
+++ b/testsuite/tests/typecheck/should_compile/all.T
@@ -683,4 +683,4 @@ test('UnliftedNewtypesForall', normal, compile, [''])
 test('UnlifNewUnify', normal, compile, [''])
 test('UnliftedNewtypesLPFamily', normal, compile, [''])
 test('UnliftedNewtypesDifficultUnification', normal, compile, [''])
-test('T16832', normal, ghci_script, [''])
+test('T16832', normal, ghci_script, ['T16832.script'])