module Signet.Unstable.Type.PayloadTest where

import qualified Signet.Unstable.Extra.Tasty as Tasty

spec :: Tasty.Spec
spec :: Spec
spec = TestName -> Spec -> Spec
Tasty.describe TestName
"Signet.Unstable.Type.Payload" (Spec -> Spec) -> Spec -> Spec
forall a b. (a -> b) -> a -> b
$ do
  () -> Spec
forall a. a -> WriterT [TestTree] Identity a
forall (f :: * -> *) a. Applicative f => a -> f a
pure ()