SWI-Prolog / npm-swipl-wasm

SWI-Prolog WebAssembly build as a NPM package
https://swi-prolog.github.io/npm-swipl-wasm/latest/index.js
Other
33 stars 3 forks source link

eye-js should support the same libraries as eye #148

Open josd opened 1 year ago

josd commented 1 year ago

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.
jeswr commented 1 year ago

For my own reference; the arr of modules to test for

const packages = [
      'lists',
      'gensym',
      'system',
      'terms',
      'url',
      'charsio',
      'qsave',
      'base64',
      'date',
      'prolog_jiti',
      'sha',
      'dif',
      'semweb/turtle',
      'pcre',
      'uuid',
      'http/http_open',
    ]