Packages

  • package root
    Definition Classes
    root
  • package zio
    Definition Classes
    root
  • package test

    _ZIO Test_ is a featherweight testing library for effectful programs.

    _ZIO Test_ is a featherweight testing library for effectful programs.

    The library imagines every spec as an ordinary immutable value, providing tremendous potential for composition. Thanks to tight integration with ZIO, specs can use resources (including those requiring disposal), have well- defined linear and parallel semantics, and can benefit from a host of ZIO combinators.

    import zio.test._
    import zio.clock.nanoTime
    import Assertion.isGreaterThan
    
    object MyTest extends DefaultRunnableSpec {
      suite("clock") {
        testM("time is non-zero") {
          assertM(nanoTime, isGreaterThan(0))
        }
      }
    }
    Definition Classes
    zio
  • package environment

    The environment package contains testable versions of all the standard ZIO environment types through the TestClock, TestConsole, TestSystem, and TestRandom modules.

    The environment package contains testable versions of all the standard ZIO environment types through the TestClock, TestConsole, TestSystem, and TestRandom modules. See the documentation on the individual modules for more detail about using each of them.

    If you are using ZIO Test and extending DefaultRunnableSpec a TestEnvironment containing all of them will be automatically provided to each of your tests. Otherwise, the easiest way to use the test implementations in ZIO Test is by providing the TestEnvironment to your program.

    import zio.test.environment._
    
    myProgram.provideManaged(testEnvironmentManaged)

    Then all environmental effects, such as printing to the console or generating random numbers, will be implemented by the TestEnvironment and will be fully testable. When you do need to access the "live" environment, for example to print debugging information to the console, just use the live combinator along with the effect as your normally would.

    If you are only interested in one of the test implementations for your application, you can also access them a la carte through the make method on each module. Each test module requires some data on initialization. Default data is included for each as DefaultData.

    import zio.test.environment._
    
    myProgram.provideM(TestConsole.make(TestConsole.DefaultData))

    Finally, you can create a Test object that implements the test interface directly using the makeTest method. This can be useful when you want to access some testing functionality without using the environment type.

    import zio.test.environment._
    
    for {
      testRandom <- TestRandom.makeTest(TestRandom.DefaultData)
      n          <- testRandom.nextInt
    } yield n

    This can also be useful when you are creating a more complex environment to provide the implementation for test services that you mix in.

  • package mock
  • package reflect
  • AbstractRunnableSpec
  • Assertion
  • AssertionValue
  • BoolAlgebra
  • CheckVariants
  • DefaultRunnableSpec
  • DefaultTestReporter
  • DefaultTestRunner
  • ExecutionStrategy
  • FailureDetails
  • FunctionVariants
  • Gen
  • GenFailureDetails
  • GenZIO
  • RenderedResult
  • RunnableSpec
  • Sample
  • Sized
  • Spec
  • SummaryBuilder
  • TestAnnotation
  • TestAnnotationMap
  • TestArgs
  • TestAspect
  • TestExecutor
  • TestFailure
  • TestLogger
  • TestPlatform
  • TestReporter
  • TestRunner
  • TestSuccess
  • TestTimeoutException
  • TimeoutVariants
  • ZSpecSyntax
p

zio

test

package test

_ZIO Test_ is a featherweight testing library for effectful programs.

The library imagines every spec as an ordinary immutable value, providing tremendous potential for composition. Thanks to tight integration with ZIO, specs can use resources (including those requiring disposal), have well- defined linear and parallel semantics, and can benefit from a host of ZIO combinators.

import zio.test._
import zio.clock.nanoTime
import Assertion.isGreaterThan

object MyTest extends DefaultRunnableSpec {
  suite("clock") {
    testM("time is non-zero") {
      assertM(nanoTime, isGreaterThan(0))
    }
  }
}
Linear Supertypes
Ordering
  1. Alphabetic
  2. By Inheritance
Inherited
  1. test
  2. CheckVariants
  3. AnyRef
  4. Any
  1. Hide All
  2. Show All
Visibility
  1. Public
  2. All

Type Members

  1. abstract class AbstractRunnableSpec extends AnyRef
    Annotations
    @EnableReflectiveInstantiation()
  2. type AssertResult = BoolAlgebra[AssertionValue]
  3. class Assertion[-A] extends (⇒ A) ⇒ AssertResult

    An Assertion[A] is capable of producing assertion results on an A.

    An Assertion[A] is capable of producing assertion results on an A. As a proposition, assertions compose using logical conjuction and disjunction, and can be negated.

  4. sealed trait AssertionValue extends AnyRef

    An AssertionValue keeps track of a assertion and a value, existentially hiding the type.

    An AssertionValue keeps track of a assertion and a value, existentially hiding the type. This is used internally by the library to provide useful error messages in the event of test failures.

  5. sealed trait BoolAlgebra[+A] extends Product with Serializable

    A BoolAlgebra[A] is a description of logical operations on values of type A.

  6. trait CheckVariants extends AnyRef
  7. abstract class DefaultRunnableSpec extends RunnableSpec[TestEnvironment, String, Either[TestFailure[Nothing], TestSuccess[Any]], Any, Any]

    A default runnable spec that provides testable versions of all of the modules in ZIO (Clock, Random, etc).

  8. type ExecutedSpec[+L, +E, +S] = Spec[Any, Nothing, L, Either[TestFailure[E], TestSuccess[S]]]

    An ExecutedSpec is a spec that has been run to produce test results.

  9. sealed trait ExecutionStrategy extends AnyRef
  10. final case class FailureDetails(fragment: AssertionValue, whole: AssertionValue, gen: Option[GenFailureDetails] = None) extends Product with Serializable

    FailureDetails keeps track of details relevant to failures.

  11. trait FunctionVariants extends AnyRef
  12. case class Gen[-R, +A](sample: ZStream[R, Nothing, Sample[R, A]]) extends Product with Serializable

    A Gen[R, A] represents a generator of values of type A, which requires an environment R.

    A Gen[R, A] represents a generator of values of type A, which requires an environment R. Generators may be random or deterministic.

  13. sealed trait GenFailureDetails extends AnyRef

    GenFailureDetails keeps track of relevant information related to a failure in a generative test.

  14. trait GenZIO extends AnyRef
  15. case class RenderedResult(caseType: CaseType, label: String, status: Status, offset: Int, rendered: Seq[String]) extends Product with Serializable
  16. abstract class RunnableSpec[R, L, T, E, S] extends AbstractRunnableSpec

    A RunnableSpec has a main function and can be run by the JVM / Scala.js.

  17. final case class Sample[-R, +A](value: A, shrink: ZStream[R, Nothing, Sample[R, A]]) extends Product with Serializable

    A sample is a single observation from a random variable, together with a tree of "shrinkings" used for minimization of "large" failures.

  18. trait Sized extends AnyRef
  19. final case class Spec[-R, +E, +L, +T](caseValue: SpecCase[R, E, L, T, Spec[R, E, L, T]]) extends Product with Serializable

    A Spec[R, E, L, T] is the backbone of _ZIO Test_.

    A Spec[R, E, L, T] is the backbone of _ZIO Test_. Every spec is either a suite, which contains other specs, or a test of type T. All specs are annotated with labels of type L, require an environment of type R and may potentially fail with an error of type E.

  20. final class TestAnnotation[V] extends AnyRef

    A type of annotation.

  21. class TestAnnotationMap extends AnyRef

    An annotation map keeps track of annotations of different types.

  22. case class TestArgs(testSearchTerm: Option[String]) extends Product with Serializable
  23. trait TestAspect[+LowerR, -UpperR, +LowerE, -UpperE, +LowerS, -UpperS] extends AnyRef

    A TestAspect is an aspect that can be weaved into specs.

    A TestAspect is an aspect that can be weaved into specs. You can think of an aspect as a polymorphic function, capable of transforming one test into another, possibly enlarging the environment, error, or success type.

  24. type TestAspectPoly = TestAspect[Nothing, Any, Nothing, Any, Nothing, Any]

    A TestAspectPoly is a TestAspect that is completely polymorphic, having no requirements on error or environment.

  25. type TestExecutor[+R, L, -T, E, +S] = (Spec[R, E, L, T], ExecutionStrategy) ⇒ UIO[ExecutedSpec[L, E, S]]

    A TestExecutor[R, L, T, E, S] is capable of executing specs containing tests of type T, annotated with labels of type L, that require an environment R and may fail with an E or succeed with a S.

  26. sealed trait TestFailure[+E] extends AnyRef
  27. trait TestLogger extends AnyRef
  28. type TestReporter[-L, -E, -S] = (Duration, ExecutedSpec[L, E, S]) ⇒ URIO[TestLogger, Unit]

    A TestReporter[L, E, S] is capable of reporting test results annotated with labels L, error type E, and success type S.

  29. type TestResult = BoolAlgebra[FailureDetails]
  30. case class TestRunner[R, L, -T, E, S](executor: TestExecutor[R, L, T, E, S], platform: Platform = ..., reporter: TestReporter[L, E, S] = DefaultTestReporter()) extends Product with Serializable

    A TestRunner[R, E, L, S] encapsulates all the logic necessary to run specs that require an environment R and may fail with an error E or succeed with an S, using labels of type L.

    A TestRunner[R, E, L, S] encapsulates all the logic necessary to run specs that require an environment R and may fail with an error E or succeed with an S, using labels of type L. Test runners require a test executor, a platform, and a reporter.

  31. sealed trait TestSuccess[+S] extends AnyRef
  32. final case class TestTimeoutException(message: String) extends Throwable with Product with Serializable
  33. trait TimeoutVariants extends AnyRef
  34. type ZSpec[-R, +E, +L, +S] = Spec[R, E, L, Either[TestFailure[Nothing], TestSuccess[S]]]

    A ZSpec[R, E, L, S] is the canonical spec for testing ZIO programs.

    A ZSpec[R, E, L, S] is the canonical spec for testing ZIO programs. The spec's test type is a ZIO effect that requires an R, might fail with an E, might succeed with an S, and whose nodes are annotated with labels L.

  35. implicit class ZSpecSyntax[R, E, L, S] extends AnyRef

    Adds syntax for adding aspects.

    Adds syntax for adding aspects.

    test("foo") { assert(42, equalTo(42)) } @@ ignore
  36. type ZTest[-R, +E, +S] = ZIO[R, E, Either[TestFailure[Nothing], TestSuccess[S]]]

    A ZTest[R, E, S] is an effectfully produced test that requires an R and may fail with an E or succeed with a S.

Value Members

  1. final def assert[A](value: ⇒ A, assertion: Assertion[A]): TestResult

    Checks the assertion holds for the given value.

  2. final def assertM[R, E, A](value: ZIO[R, E, A], assertion: Assertion[A]): ZIO[R, E, TestResult]

    Checks the assertion holds for the given effectfully-computed value.

  3. final def check[R, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(test: (A, B, C, D) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of check that accepts four random variables.

    A version of check that accepts four random variables.

    Definition Classes
    CheckVariants
  4. final def check[R, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(test: (A, B, C) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of check that accepts three random variables.

    A version of check that accepts three random variables.

    Definition Classes
    CheckVariants
  5. final def check[R, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(test: (A, B) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of check that accepts two random variables.

    A version of check that accepts two random variables.

    Definition Classes
    CheckVariants
  6. final def check[R, A](rv: Gen[R, A])(test: (A) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    Checks the test passes for "sufficient" numbers of samples from the given random variable.

    Checks the test passes for "sufficient" numbers of samples from the given random variable.

    Definition Classes
    CheckVariants
  7. final def checkAll[R, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(test: (A, B, C, D) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkAll that accepts four random variables.

    A version of checkAll that accepts four random variables.

    Definition Classes
    CheckVariants
  8. final def checkAll[R, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(test: (A, B, C) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkAll that accepts three random variables.

    A version of checkAll that accepts three random variables.

    Definition Classes
    CheckVariants
  9. final def checkAll[R, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(test: (A, B) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkAll that accepts two random variables.

    A version of checkAll that accepts two random variables.

    Definition Classes
    CheckVariants
  10. final def checkAll[R, A](rv: Gen[R, A])(test: (A) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    Checks the test passes for all values from the given random variable.

    Checks the test passes for all values from the given random variable. This is useful for deterministic Gen that comprehensively explore all possibilities in a given domain.

    Definition Classes
    CheckVariants
  11. final def checkAllM[R, E, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(test: (A, B, C, D) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkAllM that accepts four random variables.

    A version of checkAllM that accepts four random variables.

    Definition Classes
    CheckVariants
  12. final def checkAllM[R, E, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(test: (A, B, C) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkAllM that accepts three random variables.

    A version of checkAllM that accepts three random variables.

    Definition Classes
    CheckVariants
  13. final def checkAllM[R, E, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(test: (A, B) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkAllM that accepts two random variables.

    A version of checkAllM that accepts two random variables.

    Definition Classes
    CheckVariants
  14. final def checkAllM[R, E, A](rv: Gen[R, A])(test: (A) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    Checks the effectual test passes for all values from the given random variable.

    Checks the effectual test passes for all values from the given random variable. This is useful for deterministic Gen that comprehensively explore all possibilities in a given domain.

    Definition Classes
    CheckVariants
  15. final def checkM[R, E, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(test: (A, B, C, D) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkM that accepts four random variables.

    A version of checkM that accepts four random variables.

    Definition Classes
    CheckVariants
  16. final def checkM[R, E, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(test: (A, B, C) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkM that accepts three random variables.

    A version of checkM that accepts three random variables.

    Definition Classes
    CheckVariants
  17. final def checkM[R, E, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(test: (A, B) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkM that accepts two random variables.

    A version of checkM that accepts two random variables.

    Definition Classes
    CheckVariants
  18. final def checkM[R, E, A](rv: Gen[R, A])(test: (A) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    Checks the effectual test passes for "sufficient" numbers of samples from the given random variable.

    Checks the effectual test passes for "sufficient" numbers of samples from the given random variable.

    Definition Classes
    CheckVariants
  19. final def checkSome[R, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(n: Int)(test: (A, B, C, D) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkSome that accepts four random variables.

    A version of checkSome that accepts four random variables.

    Definition Classes
    CheckVariants
  20. final def checkSome[R, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(n: Int)(test: (A, B, C) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkSome that accepts three random variables.

    A version of checkSome that accepts three random variables.

    Definition Classes
    CheckVariants
  21. final def checkSome[R, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(n: Int)(test: (A, B) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    A version of checkSome that accepts two random variables.

    A version of checkSome that accepts two random variables.

    Definition Classes
    CheckVariants
  22. final def checkSome[R, A](rv: Gen[R, A])(n: Int)(test: (A) ⇒ TestResult): ZIO[R, Nothing, TestResult]

    Checks the test passes for the specified number of samples from the given random variable.

    Checks the test passes for the specified number of samples from the given random variable.

    Definition Classes
    CheckVariants
  23. final def checkSomeM[R, E, A, B, C, D](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C], rv4: Gen[R, D])(n: Int)(test: (A, B, C, D) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkSomeM that accepts four random variables.

    A version of checkSomeM that accepts four random variables.

    Definition Classes
    CheckVariants
  24. final def checkSomeM[R, E, A, B, C](rv1: Gen[R, A], rv2: Gen[R, B], rv3: Gen[R, C])(n: Int)(test: (A, B, C) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkSomeM that accepts three random variables.

    A version of checkSomeM that accepts three random variables.

    Definition Classes
    CheckVariants
  25. final def checkSomeM[R, E, A, B](rv1: Gen[R, A], rv2: Gen[R, B])(n: Int)(test: (A, B) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    A version of checkSomeM that accepts two random variables.

    A version of checkSomeM that accepts two random variables.

    Definition Classes
    CheckVariants
  26. final def checkSomeM[R, E, A](rv: Gen[R, A])(n: Int)(test: (A) ⇒ ZIO[R, E, TestResult]): ZIO[R, E, TestResult]

    Checks the effectual test passes for the specified number of samples from the given random variable.

    Checks the effectual test passes for the specified number of samples from the given random variable.

    Definition Classes
    CheckVariants
  27. val defaultTestRunner: TestRunner[TestEnvironment, String, Either[TestFailure[Nothing], TestSuccess[Any]], Any, Any]
  28. final def fail[E](cause: Cause[E]): ZTest[Any, E, Nothing]

    Creates a failed test result with the specified runtime cause.

  29. final val ignore: ZTest[Any, Nothing, Nothing]

    Creates an ignored test result.

  30. final def platformSpecific[R, E, A, S](js: ⇒ A, jvm: ⇒ A)(f: (A) ⇒ ZTest[R, E, S]): ZTest[R, E, S]

    Passes platform specific information to the specified function, which will use that information to create a test.

    Passes platform specific information to the specified function, which will use that information to create a test. If the platform is neither ScalaJS nor the JVM, an ignored test result will be returned.

  31. final def suite[R, E, L, T](label: L)(specs: Spec[R, E, L, T]*): Spec[R, E, L, T]

    Builds a suite containing a number of other specs.

  32. final def test[L](label: L)(assertion: ⇒ TestResult): ZSpec[Any, Nothing, L, Unit]

    Builds a spec with a single pure test.

  33. final def testM[R, E, L](label: L)(assertion: ZIO[R, E, TestResult]): ZSpec[R, E, L, Unit]

    Builds a spec with a single effectful test.

  34. object Assertion
  35. object AssertionValue
  36. object BoolAlgebra extends Serializable
  37. object DefaultTestReporter
  38. object DefaultTestRunner extends TestRunner[TestEnvironment, String, Either[TestFailure[Nothing], TestSuccess[Any]], Any, Any]

    A Runner that provides a default testable environment.

  39. object ExecutionStrategy
  40. object Gen extends GenZIO with FunctionVariants with Serializable
  41. object GenFailureDetails
  42. object RenderedResult extends Serializable
  43. object Sample extends Serializable
  44. object Sized
  45. object Spec extends Serializable
  46. object SummaryBuilder
  47. object TestAnnotation
  48. object TestAnnotationMap
  49. object TestArgs extends Serializable
  50. object TestAspect extends TimeoutVariants
  51. object TestExecutor
  52. object TestFailure
  53. object TestLogger
  54. object TestPlatform

    TestPlatform provides information about the platform tests are being run on to enable platform specific test configuration.

  55. object TestReporter
  56. object TestSuccess

Inherited from CheckVariants

Inherited from AnyRef

Inherited from Any

Ungrouped