module Signet.Unstable.Exception.VerificationExceptionTest where import qualified Heck as Test spec :: (Monad tree) => Test.Test io tree -> tree () spec :: forall (tree :: * -> *) (io :: * -> *). Monad tree => Test io tree -> tree () spec Test io tree test = Test io tree -> String -> tree () -> tree () forall (m :: * -> *) (n :: * -> *). Test m n -> String -> n () -> n () Test.describe Test io tree test String "Signet.Unstable.Exception.VerificationException" (tree () -> tree ()) -> tree () -> tree () forall a b. (a -> b) -> a -> b $ do () -> tree () forall a. a -> tree a forall (f :: * -> *) a. Applicative f => a -> f a pure ()