SWI-Prolog/swish

No permission to call sandboxed `nonground(_1396,_1398)'

Closed this issue · 2 comments

Given the following simple CHR-Program

:- use_module(library(chr)).
:- chr_constraint leq/2.

reflexivity  @ leq(X,X) <=> true.
antisymmetry @ leq(X,Y), leq(Y,X) <=> X = Y.
idempotence  @ leq(X,Y) \ leq(X,Y) <=> true.
transitivity @ leq(X,Y), leq(Y,Z) ==> leq(X,Z).

Asking, for example, this query:

?- leq(A,B), leq(B,C).

The following error gets thrown in SWISH.

No permission to call sandboxed `nonground(_1396,_1398)'
Reachable from:
	  'chr newvia_2'(A,B,C)
	  leq___2__0(A,B,C)
	  leq(A,B)

Thanks for reporting. Now works (for local installations requires updating to the latest git version of SWI-Prolog).

Thanks!