{-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE IncoherentInstances #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}

-- | This module defines all the functions you will use to define your test suite.
module Test.Syd.Def.AroundAll where

import Control.Monad.Writer.Strict
import Test.QuickCheck.IO ()
import Test.Syd.Def.TestDefM
import Test.Syd.HList
import Test.Syd.SpecDef

-- | Run a custom action before all spec items in a group, to set up an outer resource 'a'.
beforeAll ::
  -- | The function to run (once), beforehand, to produce the outer resource.
  IO outer ->
  TestDefM (outer ': otherOuters) inner result ->
  TestDefM otherOuters inner result
beforeAll :: forall outer (otherOuters :: [*]) inner result.
IO outer
-> TestDefM (outer : otherOuters) inner result
-> TestDefM otherOuters inner result
beforeAll IO outer
action = forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest forall a b. (a -> b) -> a -> b
$ \TestForest (outer : otherOuters) inner
forest -> forall newOuter (otherOuters :: [*]) inner extra.
IO newOuter
-> SpecDefForest (newOuter : otherOuters) inner extra
-> SpecDefTree otherOuters inner extra
DefBeforeAllNode IO outer
action TestForest (outer : otherOuters) inner
forest

-- | Run a custom action before all spec items in a group without setting up any outer resources.
beforeAll_ ::
  -- | The function to run (once), beforehand.
  IO () ->
  TestDefM outers inner result ->
  TestDefM outers inner result
beforeAll_ :: forall (outers :: [*]) inner result.
IO ()
-> TestDefM outers inner result -> TestDefM outers inner result
beforeAll_ IO ()
action = forall (outers :: [*]) inner result.
(IO () -> IO ())
-> TestDefM outers inner result -> TestDefM outers inner result
aroundAll_ (IO ()
action forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>>)

-- | Run a custom action before all spec items in a group, to set up an outer resource 'b' by using the outer resource 'a'.
beforeAllWith ::
  -- | The function to run (once), beforehand, to produce a new outer resource while using a previous outer resource
  (previousOuter -> IO newOuter) ->
  TestDefM (newOuter ': previousOuter ': otherOuters) inner result ->
  TestDefM (previousOuter ': otherOuters) inner result
beforeAllWith :: forall previousOuter newOuter (otherOuters :: [*]) inner result.
(previousOuter -> IO newOuter)
-> TestDefM (newOuter : previousOuter : otherOuters) inner result
-> TestDefM (previousOuter : otherOuters) inner result
beforeAllWith previousOuter -> IO newOuter
action = forall newOuter oldOuter (otherOuters :: [*]) inner result.
((newOuter -> IO ()) -> oldOuter -> IO ())
-> TestDefM (newOuter : oldOuter : otherOuters) inner result
-> TestDefM (oldOuter : otherOuters) inner result
aroundAllWith forall a b. (a -> b) -> a -> b
$ \newOuter -> IO ()
func previousOuter
b -> do
  newOuter
a <- previousOuter -> IO newOuter
action previousOuter
b
  newOuter -> IO ()
func newOuter
a

-- | Run a custom action after all spec items, using the outer resource 'a'.
afterAll ::
  -- | The function to run (once), afterwards, using the outer resource.
  (outer -> IO ()) ->
  TestDefM (outer ': otherOuters) inner result ->
  TestDefM (outer ': otherOuters) inner result
afterAll :: forall outer (otherOuters :: [*]) inner result.
(outer -> IO ())
-> TestDefM (outer : otherOuters) inner result
-> TestDefM (outer : otherOuters) inner result
afterAll outer -> IO ()
func = forall (outers :: [*]) inner result.
(HList outers -> IO ())
-> TestDefM outers inner result -> TestDefM outers inner result
afterAll' forall a b. (a -> b) -> a -> b
$ \(HCons e
a HList l
_) -> outer -> IO ()
func e
a

-- | Run a custom action after all spec items, using all the outer resources.
afterAll' ::
  -- | The function to run (once), afterwards, using all outer resources.
  (HList outers -> IO ()) ->
  TestDefM outers inner result ->
  TestDefM outers inner result
afterAll' :: forall (outers :: [*]) inner result.
(HList outers -> IO ())
-> TestDefM outers inner result -> TestDefM outers inner result
afterAll' HList outers -> IO ()
func = forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest forall a b. (a -> b) -> a -> b
$ \TestForest outers inner
forest -> forall (outers :: [*]) inner extra.
(HList outers -> IO ())
-> SpecDefForest outers inner extra
-> SpecDefTree outers inner extra
DefAfterAllNode HList outers -> IO ()
func TestForest outers inner
forest

-- | Run a custom action after all spec items without using any outer resources.
afterAll_ ::
  -- | The function to run (once), afterwards.
  IO () ->
  TestDefM outers inner result ->
  TestDefM outers inner result
afterAll_ :: forall (outers :: [*]) inner result.
IO ()
-> TestDefM outers inner result -> TestDefM outers inner result
afterAll_ IO ()
action = forall (outers :: [*]) inner result.
(HList outers -> IO ())
-> TestDefM outers inner result -> TestDefM outers inner result
afterAll' forall a b. (a -> b) -> a -> b
$ \HList outers
_ -> IO ()
action

-- | Run a custom action before and/or after all spec items in group, to provide access to a resource 'a'.
--
-- See the @FOOTGUN@ note in the docs for 'around_'.
aroundAll ::
  -- | The function that provides the outer resource (once), around the tests.
  ((outer -> IO ()) -> IO ()) ->
  TestDefM (outer ': otherOuters) inner result ->
  TestDefM otherOuters inner result
aroundAll :: forall outer (otherOuters :: [*]) inner result.
((outer -> IO ()) -> IO ())
-> TestDefM (outer : otherOuters) inner result
-> TestDefM otherOuters inner result
aroundAll (outer -> IO ()) -> IO ()
func = forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest forall a b. (a -> b) -> a -> b
$ \TestForest (outer : otherOuters) inner
forest -> forall newOuter (otherOuters :: [*]) inner extra.
((newOuter -> IO ()) -> IO ())
-> SpecDefForest (newOuter : otherOuters) inner extra
-> SpecDefTree otherOuters inner extra
DefAroundAllNode (outer -> IO ()) -> IO ()
func TestForest (outer : otherOuters) inner
forest

-- | Run a custom action before and/or after all spec items in a group without accessing any resources.
--
-- == __FOOTGUN__
--
-- This combinator gives the programmer a lot of power.
-- In fact, it gives the programmer enough power to break the test framework.
-- Indeed, you can provide a wrapper function that just _doesn't_ run the function like this:
--
-- > spec :: Spec
-- > spec = do
-- >    let don'tDo :: IO () -> IO ()
-- >        don'tDo _ = pure ()
-- >    aroundAll_ don'tDo $ do
-- >      it "should pass" True
--
-- During execution, you'll then get an error like this:
--
-- > thread blocked indefinitely in an MVar operation
--
-- The same problem exists when using 'Test.Syd.Def.Around.around_'.
--
-- Something even more pernicious goes wrong when you run the given action more than once like this:
--
-- > spec :: Spec
-- > spec = do
-- >    let doTwice :: IO () -> IO ()
-- >        doTwice f = f >> f
-- >    aroundAll_ doTwice $ do
-- >      it "should pass" True
--
-- In this case, the test will "just work", but it will be executed twice even if the output reports that it only passed once.
--
-- Note: If you're interested in fixing this, talk to me, but only after GHC has gotten impredicative types because that will likely be a requirement.
aroundAll_ ::
  -- | The function that wraps running the tests.
  (IO () -> IO ()) ->
  TestDefM outers inner result ->
  TestDefM outers inner result
aroundAll_ :: forall (outers :: [*]) inner result.
(IO () -> IO ())
-> TestDefM outers inner result -> TestDefM outers inner result
aroundAll_ IO () -> IO ()
func = forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest forall a b. (a -> b) -> a -> b
$ \TestForest outers inner
forest -> forall (outers :: [*]) inner extra.
(IO () -> IO ())
-> SpecDefForest outers inner extra
-> SpecDefTree outers inner extra
DefWrapNode IO () -> IO ()
func TestForest outers inner
forest

-- | Run a custom action before and/or after all spec items in a group to provide access to a resource 'a' while using a resource 'b'
--
-- See the @FOOTGUN@ note in the docs for 'around_'.
aroundAllWith ::
  forall newOuter oldOuter otherOuters inner result.
  -- | The function that provides the new outer resource (once), using the old outer resource.
  ((newOuter -> IO ()) -> (oldOuter -> IO ())) ->
  TestDefM (newOuter ': oldOuter ': otherOuters) inner result ->
  TestDefM (oldOuter ': otherOuters) inner result
aroundAllWith :: forall newOuter oldOuter (otherOuters :: [*]) inner result.
((newOuter -> IO ()) -> oldOuter -> IO ())
-> TestDefM (newOuter : oldOuter : otherOuters) inner result
-> TestDefM (oldOuter : otherOuters) inner result
aroundAllWith (newOuter -> IO ()) -> oldOuter -> IO ()
func = forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest forall a b. (a -> b) -> a -> b
$ \TestForest (newOuter : oldOuter : otherOuters) inner
forest -> forall newOuter oldOuter (otherOuters :: [*]) inner extra.
((newOuter -> IO ()) -> oldOuter -> IO ())
-> SpecDefForest (newOuter : oldOuter : otherOuters) inner extra
-> SpecDefTree (oldOuter : otherOuters) inner extra
DefAroundAllWithNode (newOuter -> IO ()) -> oldOuter -> IO ()
func TestForest (newOuter : oldOuter : otherOuters) inner
forest

-- | Declare a node in the spec def forest
wrapForest ::
  -- | The wrapper node
  (TestForest outers1 inner1 -> TestTree outers2 inner2) ->
  TestDefM outers1 inner1 result ->
  TestDefM outers2 inner2 result
wrapForest :: forall (outers1 :: [*]) inner1 (outers2 :: [*]) inner2 result.
(TestForest outers1 inner1 -> TestTree outers2 inner2)
-> TestDefM outers1 inner1 result -> TestDefM outers2 inner2 result
wrapForest TestForest outers1 inner1 -> TestTree outers2 inner2
func (TestDefM WriterT (TestForest outers1 inner1) (ReaderT TestDefEnv IO) result
rwst) = forall (outers :: [*]) inner result.
WriterT (TestForest outers inner) (ReaderT TestDefEnv IO) result
-> TestDefM outers inner result
TestDefM forall a b. (a -> b) -> a -> b
$
  forall a b c. (a -> b -> c) -> b -> a -> c
flip forall (m :: * -> *) a w (n :: * -> *) b w'.
(m (a, w) -> n (b, w')) -> WriterT w m a -> WriterT w' n b
mapWriterT WriterT (TestForest outers1 inner1) (ReaderT TestDefEnv IO) result
rwst forall a b. (a -> b) -> a -> b
$ \ReaderT TestDefEnv IO (result, TestForest outers1 inner1)
inner -> do
    (result
res, TestForest outers1 inner1
forest) <- ReaderT TestDefEnv IO (result, TestForest outers1 inner1)
inner
    let forest' :: TestForest outers2 inner2
forest' = [TestForest outers1 inner1 -> TestTree outers2 inner2
func TestForest outers1 inner1
forest]
    forall (f :: * -> *) a. Applicative f => a -> f a
pure (result
res, TestForest outers2 inner2
forest')