Skip to content

Commit

Permalink
TEST: Disable shared tabling tests conditionally.
Browse files Browse the repository at this point in the history
This test requires threads and library(time).
  • Loading branch information
JanWielemaker committed Oct 18, 2023
1 parent 6dbf518 commit c9f050b
Showing 1 changed file with 14 additions and 3 deletions.
17 changes: 14 additions & 3 deletions src/Tests/tabling/test_shared_units.pl
Original file line number Diff line number Diff line change
Expand Up @@ -3,9 +3,10 @@
Author: Jan Wielemaker
E-mail: [email protected]
WWW: http://www.swi-prolog.org
Copyright (c) 2019, University of Amsterdam
VU University Amsterdam
CWI, Amsterdam
Copyright (c) 2019-2023, University of Amsterdam
VU University Amsterdam
CWI, Amsterdam
SWI-Prolog Solutions b.v.
All rights reserved.
Redistribution and use in source and binary forms, with or without
Expand Down Expand Up @@ -37,6 +38,10 @@
:- module(test_shared_units,
[ test_shared_units/0
]).

:- if((exists_source(library(time)),
current_prolog_flag(threads,true))).

:- use_module(library(plunit)).
:- use_module(library(debug)).
:- use_module(library(time)).
Expand Down Expand Up @@ -71,3 +76,9 @@
thread_join(Id).

:- end_tests(shared_reeval).

:- else. % no library(time) or no threads.

test_shared_units.

:- endif.

0 comments on commit c9f050b

Please sign in to comment.