module Test.Cleveland.Lorentz.Entrypoints
  ( 
    testContractCoversEntrypointsT
  , testContractMatchesEntrypointsT
    
  , testContractCoversEntrypoints
  , testContractMatchesEntrypoints
  ) where
import Test.Tasty (TestName)
import Lorentz (NiceParameterFull)
import Test.Cleveland.Lorentz.Internal.Entrypoints
import Test.Cleveland.Michelson.Internal.Entrypoints (ignoreExtraEntrypoints)
testContractCoversEntrypointsT,
  testContractMatchesEntrypointsT :: forall exp. TestName -> ContractEPTypeTest exp
testContractCoversEntrypointsT :: TestName -> ContractEPTypeTest exp
testContractCoversEntrypointsT = (EPMismatch -> EPMismatch) -> TestName -> ContractEPTypeTest exp
forall expectedEps.
(EPMismatch -> EPMismatch)
-> TestName -> ContractEPTypeTest expectedEps
testCompareContractEntrypointsT @exp EPMismatch -> EPMismatch
ignoreExtraEntrypoints
testContractMatchesEntrypointsT :: TestName -> ContractEPTypeTest exp
testContractMatchesEntrypointsT = (EPMismatch -> EPMismatch) -> TestName -> ContractEPTypeTest exp
forall expectedEps.
(EPMismatch -> EPMismatch)
-> TestName -> ContractEPTypeTest expectedEps
testCompareContractEntrypointsT @exp EPMismatch -> EPMismatch
forall a. a -> a
id
testContractCoversEntrypoints,
  testContractMatchesEntrypoints :: NiceParameterFull contractEps => TestName -> ContractEPTest contractEps st vd
testContractCoversEntrypoints :: TestName -> ContractEPTest contractEps st vd
testContractCoversEntrypoints = (EPMismatch -> EPMismatch)
-> TestName -> ContractEPTest contractEps st vd
forall contractEps st vd.
NiceParameterFull contractEps =>
(EPMismatch -> EPMismatch)
-> TestName -> ContractEPTest contractEps st vd
testCompareContractEntrypoints EPMismatch -> EPMismatch
ignoreExtraEntrypoints
testContractMatchesEntrypoints :: TestName -> ContractEPTest contractEps st vd
testContractMatchesEntrypoints = (EPMismatch -> EPMismatch)
-> TestName -> ContractEPTest contractEps st vd
forall contractEps st vd.
NiceParameterFull contractEps =>
(EPMismatch -> EPMismatch)
-> TestName -> ContractEPTest contractEps st vd
testCompareContractEntrypoints EPMismatch -> EPMismatch
forall a. a -> a
id