graphql-engine/server/src-test/Hasura/AppSpec.hs

Ignoring revisions in .git-blame-ignore-revs. Click here to bypass and see the normal blame view.

66 lines
2.0 KiB
Haskell
Raw Normal View History

{-# LANGUAGE NumericUnderscores #-}
module Hasura.AppSpec (spec) where
import Control.Concurrent (threadDelay)
import Control.Concurrent.Async qualified as Async
import Control.Exception (throwIO)
import Hasura.App (newShutdownLatch, shutdownGracefully, waitForShutdown)
import Hasura.Prelude
import System.Timeout (timeout)
import Test.Hspec
spec :: Spec
spec = do
describe "ShutdownLatch" shutdownLatchSpec
shutdownLatchSpec :: Spec
shutdownLatchSpec = do
it "waitForShutdown blocks before shutdown, not after" $ do
latch <- newShutdownLatch
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Nothing
timeout 10_000 (shutdownGracefully latch)
`shouldReturn` Just ()
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Just ()
it "allows multiple calls to shutdownGracefully" $ do
latch <- newShutdownLatch
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Nothing
timeout 10_000 (shutdownGracefully latch)
`shouldReturn` Just ()
timeout 10_000 (shutdownGracefully latch)
`shouldReturn` Just ()
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Just ()
it "allows shutting down a thread" $ do
latch <- newShutdownLatch
Async.withAsync (waitForShutdown latch >> return ("shut down" :: String)) $ \async -> do
threadDelay 10_000
pollThrow async
`shouldReturn` Nothing
shutdownGracefully latch
(timeout 1_000_000 $ Async.wait async)
`shouldReturn` Just "shut down"
it "allows multiple threads to wait for shutdown" $ do
latch <- newShutdownLatch
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Nothing
shutdownGracefully latch
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Just ()
timeout 10_000 (waitForShutdown latch)
`shouldReturn` Just ()
pollThrow :: Async.Async a -> IO (Maybe a)
pollThrow async = do
res <- Async.poll async
case res of
Just (Left e) -> throwIO e
Just (Right x) -> pure $ Just x
Nothing -> pure Nothing