Skip to content

Commit

Permalink
test: Disable events tests for now.
Browse files Browse the repository at this point in the history
They fail because we don't have a way to construct a `Tox_System` from
FFI. Once the system PR is in, we can use `os_system()`.
  • Loading branch information
iphydf committed Sep 12, 2023
1 parent 7575bef commit d809322
Showing 1 changed file with 11 additions and 8 deletions.
19 changes: 11 additions & 8 deletions test/Network/Tox/Types/EventsSpec.hs
Original file line number Diff line number Diff line change
@@ -1,16 +1,15 @@
{-# LANGUAGE StrictData #-}
{-# LANGUAGE Trustworthy #-}
{-# LANGUAGE ViewPatterns #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE Trustworthy #-}
module Network.Tox.Types.EventsSpec where

import Control.Concurrent (threadDelay)
import Control.Monad (forM)
import Data.List (sort)
import Data.MessagePack (Object (..))
import qualified Data.MessagePack as MP
import qualified Data.Vector as V
--import Data.List (sort)
--import Data.MessagePack (Object (..))
--import qualified Data.MessagePack as MP
--import qualified Data.Vector as V
import Test.Hspec
import Test.QuickCheck
--import Test.QuickCheck

import qualified Network.Tox.C as C
import Network.Tox.Types.Events
Expand Down Expand Up @@ -48,6 +47,9 @@ toxIterate countdown toxes = do

spec :: Spec
spec = do

return ()
{- TODO(iphydf): re-enable once the c-toxcore system PR is in.
describe "event serialisation format" $ do
it "is linear encoding" $
MP.toObject MP.defaultConfig (FileChunkRequest 1 2 3 4)
Expand All @@ -70,3 +72,4 @@ spec = do
must $ C.toxBootstrap tox2 "127.0.0.1" bootstrapPort bootstrapKey
toxIterate 100 [tox1, tox2]
-}

0 comments on commit d809322

Please sign in to comment.