npm-swipl-wasm
npm-swipl-wasm copied to clipboard
eye-js should support the same libraries as eye
eye-js should support the same libraries as eye.
In order to test that, each of the following swipl queries should return true
:
use_module(library(lists)).
use_module(library(gensym)).
use_module(library(system)).
use_module(library(terms)).
use_module(library(url)).
use_module(library(charsio)).
use_module(library(qsave)).
use_module(library(base64)).
use_module(library(date)).
use_module(library(prolog_jiti)).
use_module(library(sha)).
use_module(library(dif)).
use_module(library(semweb/turtle)).
use_module(library(pcre)).
use_module(library(uuid)).
use_module(library(http/http_open)).
gmp or a gmp alternative can be tested via the following query
?- X is 555555555555555555555555555555555555555555555555555555.
X = 555555555555555555555555555555555555555555555555555555.