{-# LANGUAGE CPP #-}
module Test.Hspec (
Spec
, SpecWith
, Example
, Arg
, module Test.Hspec.Expectations
, it
, specify
, describe
, context
, example
, parallel
, sequential
, runIO
, pending
, pendingWith
, xit
, xspecify
, xdescribe
, xcontext
, focus
, fit
, fspecify
, fdescribe
, fcontext
#ifdef ENABLE_SPEC_HOOKS
, ActionWith
, before
, before_
, beforeWith
, beforeAll
, beforeAll_
, beforeAllWith
, after
, after_
, afterAll
, afterAll_
, around
, around_
, aroundWith
, aroundAll
, aroundAll_
, aroundAllWith
, mapSubject
, ignoreSubject
#endif
, hspec
) where
import Test.Hspec.Core.Spec
#ifdef ENABLE_SPEC_HOOKS
import Test.Hspec.Core.Hooks
#endif
import Test.Hspec.Runner
import Test.Hspec.Expectations
example :: Expectation -> Expectation
example :: Expectation -> Expectation
example = Expectation -> Expectation
forall a. a -> a
id