module SignetTest where

import qualified Control.Monad.Catch as Exception
import qualified Signet.Unstable.Exception.InvalidAsymmetricSignatureTest
import qualified Signet.Unstable.Exception.InvalidIdTest
import qualified Signet.Unstable.Exception.InvalidMessageTest
import qualified Signet.Unstable.Exception.InvalidPublicKeyTest
import qualified Signet.Unstable.Exception.InvalidSecretKeyTest
import qualified Signet.Unstable.Exception.InvalidSecretTest
import qualified Signet.Unstable.Exception.InvalidSignatureTest
import qualified Signet.Unstable.Exception.InvalidSignerTest
import qualified Signet.Unstable.Exception.InvalidSymmetricSignatureTest
import qualified Signet.Unstable.Exception.InvalidTimestampTest
import qualified Signet.Unstable.Exception.InvalidVerifierTest
import qualified Signet.Unstable.Exception.SignetExceptionTest
import qualified Signet.Unstable.Exception.ToleranceExceptionTest
import qualified Signet.Unstable.Exception.UnknownSignatureTest
import qualified Signet.Unstable.Exception.VerificationExceptionTest
import qualified Signet.Unstable.Extra.EitherTest
import qualified Signet.Unstable.Extra.HttpTest
import qualified Signet.Unstable.Extra.MaybeTest
import qualified Signet.Unstable.Type.AsymmetricSignatureTest
import qualified Signet.Unstable.Type.IdTest
import qualified Signet.Unstable.Type.MessageTest
import qualified Signet.Unstable.Type.PayloadTest
import qualified Signet.Unstable.Type.PublicKeyTest
import qualified Signet.Unstable.Type.SecretKeyTest
import qualified Signet.Unstable.Type.SecretTest
import qualified Signet.Unstable.Type.SignatureTest
import qualified Signet.Unstable.Type.SignaturesTest
import qualified Signet.Unstable.Type.SignerTest
import qualified Signet.Unstable.Type.SymmetricSignatureTest
import qualified Signet.Unstable.Type.Test as Test
import qualified Signet.Unstable.Type.TimestampTest
import qualified Signet.Unstable.Type.ToleranceTest
import qualified Signet.Unstable.Type.VerifierTest
import qualified Signet.UnstableTest

spec :: (Exception.MonadCatch io, Monad tree) => Test.Test io tree -> tree ()
spec :: forall (io :: * -> *) (tree :: * -> *).
(MonadCatch io, Monad tree) =>
Test io tree -> tree ()
spec Test io tree
test = do
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidAsymmetricSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidIdTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidMessageTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidPublicKeyTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidSecretKeyTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidSecretTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidSignerTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidSymmetricSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidTimestampTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.InvalidVerifierTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.SignetExceptionTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.ToleranceExceptionTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.VerificationExceptionTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadCatch io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Extra.EitherTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Extra.HttpTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Extra.MaybeTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.AsymmetricSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.IdTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.MessageTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Type.PayloadTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.PublicKeyTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SecretKeyTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SecretTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SignaturesTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SignerTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.SymmetricSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.TimestampTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(Applicative io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.ToleranceTest.spec Test io tree
test
  Test io tree -> tree ()
forall (tree :: * -> *) (io :: * -> *).
Monad tree =>
Test io tree -> tree ()
Signet.Unstable.Exception.UnknownSignatureTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.Unstable.Type.VerifierTest.spec Test io tree
test
  Test io tree -> tree ()
forall (io :: * -> *) (tree :: * -> *).
(MonadThrow io, Monad tree) =>
Test io tree -> tree ()
Signet.UnstableTest.spec Test io tree
test