module Test.Cleveland
( AliasHint
, ContractHandle (..)
, OriginateData (..)
, UntypedOriginateData (..)
, TransferData (..)
, Scenario
, PureM
, TransferFailure
, testScenario
, testScenarioOnNetwork
, scenario
, testScenarioOnEmulator
, scenarioEmulated
, withInitialNow
, withInitialLevel
, collectLogs
, logsForAddress
, MonadCleveland
, MonadOps
, MonadEmulated
, ClevelandT
, EmulatedT
, withSender
, withMoneybag
, runIO
, resolveAddress
, refillable
, newAddress
, newFreshAddress
, signBytes
, signBinary
, originate
, originateSimple
, originateUntyped
, originateUntypedSimple
, originateTypedSimple
, originateLarge
, originateLargeSimple
, originateLargeUntyped
, originateLargeUntypedSimple
, transfer
, transferMoney
, call
, importUntypedContract
, importContract
, noViews
, comment
, getBalance
, getDelegate
, registerDelegate
, getMorleyLogs
, getMorleyLogs_
, getStorage
, getFullStorage
, getSomeStorage
, getAllBigMapValues
, getAllBigMapValuesMaybe
, getBigMapSize
, getBigMapSizeMaybe
, getBigMapValueMaybe
, getBigMapValue
, getPublicKey
, getChainId
, advanceTime
, advanceLevel
, advanceToLevel
, getNow
, getLevel
, getApproximateBlockInterval
, branchout
, offshoot
, setVotingPowers
, getRunMode
, RunMode (..)
, whenEmulation
, inBatch
, EntrypointRef (..)
, VotingPowers
, mkVotingPowers
, mkVotingPowersFromMap
, failure
, assert
, (@==)
, (@/=)
, (@@==)
, (@@/=)
, checkCompares
, checkComparesWith
, evalJust
, evalRight
, Showing(..)
, attempt
, catchTransferFailure
, checkTransferFailure
, expectTransferFailure
, expectFailedWith
, expectError
, expectCustomError
, expectCustomError_
, expectCustomErrorNoArg
, expectNumericError
, clarifyErrors
, TransferFailurePredicate
, shiftOverflow
, emptyTransaction
, badParameter
, gasExhaustion
, failedWith
, addressIs
, constant
, lerror
, customError
, customError_
, customErrorNoArg
, numericError
, auto
, pattern DefEpName
, ep
, (?-)
, testScenarioProps
, TezosClientEnv(..)
, Client.MorleyClientEnv
, Client.MorleyClientEnv'(..)
, NetworkEnv (..)
, MorleyLogs
, Client.AsRPC
, Client.deriveRPC
, Client.deriveRPCWithStrategy
, Client.deriveManyRPC
, Client.deriveManyRPCWithStrategy
, mapEach
, forEach
) where
import Lorentz (EntrypointRef(..), pattern DefEpName)
import qualified Morley.Client as Client
import Morley.Client.TezosClient.Types (TezosClientEnv(..))
import Morley.Michelson.Interpret (MorleyLogs)
import Morley.Michelson.Runtime (VotingPowers, mkVotingPowers, mkVotingPowersFromMap)
import Test.Cleveland.Instances ()
import Test.Cleveland.Internal.Abstract
import Test.Cleveland.Internal.Actions
import Test.Cleveland.Internal.Client
import Test.Cleveland.Internal.Hedgehog
import Test.Cleveland.Internal.Pure
import Test.Cleveland.Internal.Scenario
import Test.Cleveland.Tasty.Internal
import Test.Cleveland.Util