mirror of
https://github.com/facebook/Haxl.git
synced 2024-12-23 08:43:16 +03:00
Add test for Async exceptions
Summary: This unit test demonstrates 2 things: 1) It is possible for Haxl computation to be interrupted in ways that block the scheduler indefinitely 2) Calling `sanitizeEnv` on the env from such a computation allows us to reuse it for future computations. If we don't do that, future computations can still block even without any exception thrown during the 2nd run. Reviewed By: DylanZA Differential Revision: D22397981 fbshipit-source-id: 48dfca49ab3485693bc772ff346945779809d9e8
This commit is contained in:
parent
76f2c62559
commit
2a20601b3b
@ -317,10 +317,10 @@ emptyEnv = initEnv stateEmpty
|
||||
-- | If you're using the env from a failed Haxl computation in a second Haxl
|
||||
-- computation, it is recommended to sanitize the Env to remove all empty
|
||||
-- IVars - especially if it's possible the first Haxl computation could've
|
||||
-- been interrupted via an async exception. This is because when we throw an
|
||||
-- async exc to a Haxl computation, it's possible that there are entries in
|
||||
-- the cache which are still blocked, while the results from outgone fetches
|
||||
-- have been discarded.
|
||||
-- been interrupted via an async exception. This is because if the Haxl
|
||||
-- computation was interrupted by an exception, it's possible that there are
|
||||
-- entries in the cache which are still blocked, while the results from
|
||||
-- outgone fetches have been discarded.
|
||||
sanitizeEnv :: Env u w -> IO (Env u w)
|
||||
sanitizeEnv env@Env{..} = do
|
||||
sanitizedDC <- DataCache.filter isIVarFull dataCache
|
||||
|
@ -133,6 +133,7 @@ test-suite test
|
||||
LoadCache
|
||||
MemoizationTests
|
||||
MockTAO
|
||||
MonadAsyncTest
|
||||
OutgoneFetchesTests
|
||||
ParallelTests
|
||||
ProfileTests
|
||||
|
@ -15,6 +15,7 @@ import AdoTests
|
||||
import OutgoneFetchesTests
|
||||
import ProfileTests
|
||||
import MemoizationTests
|
||||
import MonadAsyncTest
|
||||
import TestBadDataSource
|
||||
import FullyAsyncTest
|
||||
import WriteTests
|
||||
@ -34,6 +35,7 @@ allTests = TestList
|
||||
, TestLabel "OutgoneFetchesTest" OutgoneFetchesTests.tests
|
||||
, TestLabel "ProfileTests" ProfileTests.tests
|
||||
, TestLabel "MemoizationTests" MemoizationTests.tests
|
||||
, TestLabel "MonadAsyncTests" MonadAsyncTest.tests
|
||||
, TestLabel "BadDataSourceTests" TestBadDataSource.tests
|
||||
, TestLabel "FullyAsyncTest" FullyAsyncTest.tests
|
||||
, TestLabel "WriteTest" WriteTests.tests
|
||||
|
128
tests/MonadAsyncTest.hs
Normal file
128
tests/MonadAsyncTest.hs
Normal file
@ -0,0 +1,128 @@
|
||||
-- Copyright (c) 2014-present, Facebook, Inc.
|
||||
-- All rights reserved.
|
||||
--
|
||||
-- This source code is distributed under the terms of a BSD license,
|
||||
-- found in the LICENSE file.
|
||||
|
||||
{-# LANGUAGE OverloadedStrings #-}
|
||||
{-# LANGUAGE ScopedTypeVariables #-}
|
||||
{-# LANGUAGE StandaloneDeriving #-}
|
||||
{-# LANGUAGE ApplicativeDo #-}
|
||||
{-# LANGUAGE GADTs #-}
|
||||
{-# LANGUAGE TypeFamilies #-}
|
||||
{-# LANGUAGE FlexibleInstances #-}
|
||||
{-# LANGUAGE MultiParamTypeClasses #-}
|
||||
|
||||
module MonadAsyncTest (tests) where
|
||||
import Haxl.Core
|
||||
import Test.HUnit hiding (State)
|
||||
import Control.Concurrent
|
||||
import Control.Exception as Exception
|
||||
import Control.Monad
|
||||
import Haxl.Core.Monad (unsafeLiftIO)
|
||||
import System.IO.Unsafe
|
||||
import Data.Hashable
|
||||
import Data.IORef
|
||||
import Data.Text (Text)
|
||||
|
||||
newtype SimpleWrite = SimpleWrite Text deriving (Eq, Show)
|
||||
|
||||
{-# NOINLINE shouldThrowRef #-}
|
||||
shouldThrowRef :: IORef Bool
|
||||
shouldThrowRef = unsafePerformIO (newIORef False)
|
||||
|
||||
-- | This datasource contains "bad" code which can throw at the wrong
|
||||
-- moment.
|
||||
data ThrowableSleep a where
|
||||
Sleep :: Int -> ThrowableSleep Int
|
||||
|
||||
deriving instance Eq (ThrowableSleep a)
|
||||
deriving instance Show (ThrowableSleep a)
|
||||
|
||||
instance ShowP ThrowableSleep where showp = show
|
||||
|
||||
instance Hashable (ThrowableSleep a) where
|
||||
hashWithSalt s (Sleep n) = hashWithSalt s n
|
||||
|
||||
instance StateKey ThrowableSleep where
|
||||
data State ThrowableSleep = ThrowableSleepState
|
||||
|
||||
initDataSource :: IO (State ThrowableSleep)
|
||||
initDataSource = return ThrowableSleepState
|
||||
|
||||
instance DataSourceName ThrowableSleep where
|
||||
dataSourceName _ = "ThrowableSleep"
|
||||
|
||||
instance DataSource u ThrowableSleep where
|
||||
fetch _state _flags _u = BackgroundFetch $ \bfs -> forM_ bfs fill
|
||||
where
|
||||
fill :: BlockedFetch ThrowableSleep -> IO ()
|
||||
fill (BlockedFetch (Sleep n) rv) = do
|
||||
_ <- forkFinally
|
||||
(do
|
||||
threadDelay (n*1000)
|
||||
return n
|
||||
)
|
||||
(\res -> do
|
||||
shouldThrow <- atomicModifyIORef' shouldThrowRef (\s -> (False, s))
|
||||
-- Simulate case when datasource throws before putting Result into
|
||||
-- completions queue.
|
||||
when shouldThrow $ do
|
||||
throwIO $ ErrorCall "datasource threw an exception"
|
||||
-- In case the datasource throws before this point, there'll be
|
||||
-- nothing to put the result to the queue of 'completions', and
|
||||
-- therefore Haxl would block indefinitely.
|
||||
--
|
||||
-- Note that Haxl tries to catch datasource exceptions and put the
|
||||
-- "exception result" into `completions` using `wrapFetchInCatch`
|
||||
-- function. However that doesn't work in this case because the
|
||||
-- datasource throws in a separate thread.
|
||||
putResultFromChildThread rv res
|
||||
)
|
||||
return ()
|
||||
|
||||
tests :: Test
|
||||
tests = TestList
|
||||
[ TestLabel "exceptionTest" exceptionTest
|
||||
]
|
||||
|
||||
mkTestEnv :: IO (Env () SimpleWrite)
|
||||
mkTestEnv = do
|
||||
st <- initDataSource
|
||||
initEnv (stateSet st stateEmpty) ()
|
||||
|
||||
exceptionTest :: Test
|
||||
exceptionTest = TestCase $ do
|
||||
e <- mkTestEnv
|
||||
|
||||
let
|
||||
fet (n :: Int) (st :: Bool )= do
|
||||
x <- dataFetch (Sleep (fromIntegral n))
|
||||
unsafeLiftIO $ writeIORef shouldThrowRef st
|
||||
y <- dataFetch (Sleep (fromIntegral x*2))
|
||||
return (x+y)
|
||||
|
||||
r1 :: (Either Exception.SomeException Int)
|
||||
<- Exception.try $ runHaxl e $ fet 10 True
|
||||
|
||||
-- Datasources are responsible for putting the fetched result into the
|
||||
-- completions queue. If for some reason they fail to do so, Haxl throws a
|
||||
-- LogicBug since the scheduler is still expecting some request(s) to
|
||||
-- be completed.
|
||||
case r1 of
|
||||
Left ex | Just (LogicBug _) <- Exception.fromException ex -> return ()
|
||||
_ -> assertFailure "r1 computation did not fail with Logic Bug!"
|
||||
|
||||
-- Sanitize the env to get rid of all empty IVars
|
||||
-- While this test examines the case when there's an exception in the Haxl
|
||||
-- datasource itself, a similar behavior will occur in case an async
|
||||
-- exception is thrown to the Haxl scheduler thread.
|
||||
e' <- sanitizeEnv e
|
||||
|
||||
r2 :: (Either Exception.SomeException Int)
|
||||
<- Exception.try $ runHaxl e' $ fet 10 False
|
||||
case r2 of
|
||||
Right _ -> return ()
|
||||
Left ex | Just (LogicBug _) <- Exception.fromException ex -> do
|
||||
assertFailure $ "bad exception in r2: " ++ show ex
|
||||
Left _ -> return ()
|
Loading…
Reference in New Issue
Block a user