diff --git a/libraries/ghc-experimental/src/GHC/Wasm/Prim.hs b/libraries/ghc-experimental/src/GHC/Wasm/Prim.hs
index 4bded6b3cab85ca43dd52bb3910077daaea1de10..0e90fce0560e5f423194390b2df1f7c897c9b0e0 100644
--- a/libraries/ghc-experimental/src/GHC/Wasm/Prim.hs
+++ b/libraries/ghc-experimental/src/GHC/Wasm/Prim.hs
@@ -2,7 +2,7 @@
 
 module GHC.Wasm.Prim (
   -- User-facing JSVal type and freeJSVal
-  JSVal (..),
+  JSVal,
   freeJSVal,
 
   -- The JSString type and conversion from/to Haskell String
@@ -20,4 +20,3 @@ module GHC.Wasm.Prim (
 ) where
 
 import GHC.Internal.Wasm.Prim
-
diff --git a/testsuite/tests/jsffi/jsffigc.hs b/testsuite/tests/jsffi/jsffigc.hs
index 1ad8ebe6ed91e3fc6d61c45231a3f8597b81fcf7..a7427cad17c1700769d55c6be2980f288d4a2d53 100644
--- a/testsuite/tests/jsffi/jsffigc.hs
+++ b/testsuite/tests/jsffi/jsffigc.hs
@@ -4,7 +4,7 @@ module Test where
 
 import Data.Maybe
 import GHC.Exts
-import GHC.Wasm.Prim
+import GHC.Internal.Wasm.Prim
 import GHC.Weak
 import System.Mem