-
Question for @triska (or anyone):
Let's say I have a query like:
```
?- between(1,3,X).
```
And I loop through the results in Prolog format:
```js
for await (const answer of pl.query(`dif(A, …
-
Below is an example taken from https://www.metalevel.at/prolog/dcg:
The Prolog code:
```
:- use_module(library(pio)).
like(What) --> "I like ", seq(What), ".", ... .
```
Test 1 using phr…
-
Why cant Scryer Prolog parse this?
```
scryer-prolog$ target/release/scryer-prolog -v
v0.9.4-165-g12a61cdf
scryer-prolog$ target/release/scryer-prolog
?- current_op(X, Y, *).
X = 400, Y =…
-
There are two different objectives. One is that the output should be nice and consistent. That is desirable. But then there is a more fundamental issue: Sometimes the output is just incorrect. That is…
-
As of now, the old issues are still gone. These issues are pretty valuable, as they contain many useful test cases.
-
```
$ scryer-prolog -f
?- use_module(library(freeze)).
true.
?- freeze(X,true),freeze(Y,false),bagof(Y=Y,X=Y,[Z=Z]).
X = Z, freeze:freeze(X,(true,true,false)), freeze:freeze(Y,false).
?- f…
-
```
:- use_module(library(lambda)).
til([G_0, (A,B,D)]) :-
G_0 = (D,A,B),
D = dif(_,_),
skel(B),
f(G_0).
f((dif(A,B),A=B/[],B=C/A/C)).
skel(_=_/_/_).
?- {N,Vs} +\ ( til(L)…
-
Sometimes:
```
?- X=[a,b|X], length(X, N).
throw(error(resource_error(finite_memory),length/2)).
```
But not here:
```
?- VN = ['U'=X,'V'=Y | VN], write_term(f(X,g(Y,X),Y), [variable_names(V…
-
Latest versions of LVM and Trealla Prolog implement a `function_property/2` built-in predicate, which provides similar functionality to the de facto standard `predicate_property/2` built-in predicate,…
-
It would be nice if YASR (at least the table and response tabs) supported the SPARQL-star result formats (i.e. where able to display bindings where some variables are bound to quoted triples).
Note…