Failed

logicmoo.pfc.test.sanity_base.NEG_01B.logicmoo.pfc.test.sanity_base.NEG_01B@Test_0008_Line_0000__path_6_in_user: user: ~path(6,8) (from logicmoo.pfc.test.sanity_base.logicmoo.pfc.test.sanity_base.NEG_01B)

Failing for the past 1 build (Since #9 )
Took 0 ms.

Error Message

failure = "failure=info((why_was_true(user:(\\+ ~path(6,8))),nop(ftrace(user: ~path(6,8)))))\nno_proof_for(\\+ ~path(6,8)).\n\nno_proof_for(\\+ ~path(6,8)).\n\nno_proof_for(\\+ ~path(6,8)).\n\n". failure = []. 

Standard Error

name=Test_0008_Line_0000__path_6_in_user
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
 (cd /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base ; timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "['neg_01b.pfc']")

```
%~ init_phase(after_load)
%~ init_phase(restore_state)
%
%~ init_why(after_boot,program)
%~ after_boot.
%~ Dont forget to ?- logicmoo_i_cyc_xform.
running('/var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/neg_01b.pfc'),
%~ this_test_might_need( :-( use_module( library(logicmoo_plarkc))))
%~ message_hook(
%~    error( permission_error(redefine,module,logicmoo_test),
%~      context(module/2,'Already loaded from /root/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test.pl')),
%~    error,
%~    [ '~q/~w: '-[module,2],
%~      'No permission to ~w ~w `~p\''-[redefine,module,logicmoo_test],
%~      ' (~w)'-['Already loaded from /root/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test.pl']])
%~ source_location('/var/lib/jenkins/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test_header.pl',98)
module/2: No permission to redefine module `logicmoo_test' (Already loaded from /root/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test.pl)
ERROR: /var/lib/jenkins/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test_header.pl:98:
ERROR:    module/2: No permission to redefine module `logicmoo_test' (Already loaded from /root/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test.pl)

:- use_module(library(statistics)).

%:- mpred_notrace_exec.
% reset runtime counter
/*~
~*/

%:- mpred_notrace_exec.
% reset runtime counter
:- statistics(runtime,_Secs).
/*~
~*/

:- cls.

/*~
%~ skipped(messy_on_output,cls)
~*/

~(path(X,Y)/(number(X),Y is X+2)).

/*~
%~ message_hook(
%~    error(type_error(lambda_free,path(Path,Path5)),Type_error),
%~    error,
%~    [ 'Type error: `~w\' expected, found `~p\'' - [ lambda_free,
%~                                                    path(Path,Path5)],
%~      ' (~w ~w)'-[a,compound]])
Type error: `lambda_free' expected, found `path(_560,_562)' (a compound)
ERROR: Type error: `lambda_free' expected, found `path(_560,_562)' (a compound)
%~ message_hook(
%~    goal_failed( directive,
%~      user : mpred_ain(
%~                ~( path(X,Y)/(number(X),Y is X+2)),
%~                ( mfl4(
%~                     [ 'X'=X,
%~                       'Y'=Y],
%~                      user, '/var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/neg_01b.pfc', 13) ,
%~                  ax))),
%~    warning,
%~    [ 'Goal (~w) failed: ~p' - [ directive,
%~                                 user : mpred_ain(
%~                                           ~( path(X,Y)/(number(X),Y is X+2)),
%~                                           ( mfl4(
%~                                                [ 'X'=X,
%~                                                  'Y'=Y],
%~                                                 user, '/var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/neg_01b.pfc', 13) ,
%~                                             ax))]])
Goal (directive) failed: user:mpred_ain(~(path(_516,_518)/number(_516),_518 is _516+2),(mfl4(['X'=_516,'Y'=_518],user,'/var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/neg_01b.pfc':13,13),ax))
Warning: Goal (directive) failed: user:mpred_ain(~(path(_516,_518)/number(_516),_518 is _516+2),(mfl4(['X'=_516,'Y'=_518],user,'/var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/neg_01b.pfc':13,13),ax))
~*/

path(1,2).
/*~
~*/

path(2,3).
/*~
~*/

path(3,4).
/*~
~*/

path(1,4).
/*~
~*/

path(1,3).
/*~
~*/

path(2,4).

/*~
~*/

:-  listing(path).

/*~
%~ skipped( listing(path))
~*/

:- mpred_test(path(3, 4)).
/*~
%~ ?-( mpred_test("Test_0001_Line_0000__path_3_in_user",user:path(3,4))).
passed=info(why_was_true(user:path(3,4)))
no_proof_for(path(3,4)).

no_proof_for(path(3,4)).

no_proof_for(path(3,4)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0001_Line_0000__path_3_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-pfc-test-sanity_base-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_pfc_test_sanity_base_NEG_01B_Test_0001_Line_0000_path_3_in_user-junit.xml
~*/

:- mpred_test(path(2, 3)).
/*~
%~ ?-( mpred_test("Test_0002_Line_0000__path_2_in_user",user:path(2,3))).
passed=info(why_was_true(user:path(2,3)))
no_proof_for(path(2,3)).

no_proof_for(path(2,3)).

no_proof_for(path(2,3)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0002_Line_0000__path_2_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-pfc-test-sanity_base-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_pfc_test_sanity_base_NEG_01B_Test_0002_Line_0000_path_2_in_user-junit.xml
~*/

:- mpred_test(path(1, 2)).
/*~
%~ ?-( mpred_test("Test_0003_Line_0000__path_1_in_user",user:path(1,2))).
passed=info(why_was_true(user:path(1,2)))
no_proof_for(path(1,2)).

no_proof_for(path(1,2)).

no_proof_for(path(1,2)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0003_Line_0000__path_1_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-pfc-test-sanity_base-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_pfc_test_sanity_base_NEG_01B_Test_0003_Line_0000_path_1_in_user-junit.xml
~*/

:- mpred_test(~path(1,3)).
/*~
%~ ?-( mpred_test("Test_0004_Line_0000__path_1_in_user",user: ~path(1,3))).
failure=info((why_was_true(user:(\+ ~path(1,3))),nop(ftrace(user: ~path(1,3)))))
no_proof_for(\+ ~path(1,3)).

no_proof_for(\+ ~path(1,3)).

no_proof_for(\+ ~path(1,3)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0004_Line_0000__path_1_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-pfc-test-sanity_base-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_pfc_test_sanity_base_NEG_01B_Test_0004_Line_0000_path_1_in_user-junit.xml
~*/

:- mpred_test(~path(2,4)).
/*~
%~ ?-( mpred_test("Test_0005_Line_0000__path_2_in_user",user: ~path(2,4))).
failure=info((why_was_true(user:(\+ ~path(2,4))),nop(ftrace(user: ~path(2,4)))))
no_proof_for(\+ ~path(2,4)).

no_proof_for(\+ ~path(2,4)).

no_proof_for(\+ ~path(2,4)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0005_Line_0000__path_2_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEG_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'neg_01b.pfc\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-pfc-test-sanity_base-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_pfc_test_sanity_base_NEG_01B_Test_0005_Line_0000_path_2_in_user-junit.xml
~*/

:- mpred_test(\+path(1,3)).
/*~
%~ ?-( mpred_test("Test_0006_Line_0000__naf_path_1_in_user",user:(\+path(1,3)))).
failure=info((why_was_true(user:path(1,3)),nop(ftrace(user:(\+path(1,3))))))
no_proof_for(path(1,3)).

no_proof_for(path(1,3)).

no_proof_for(path(1,3)).

name='logicmoo.pfc.test.sanity_base.NEG_01B-Test_0006_Line_0000__naf_path_1_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test
goal=user: ~path(6,8).
time=0.0004737377166748047.
failure=failure=info((why_was_true(user:(\+ ~path(6,8))),nop(ftrace(user: ~path(6,8)))))
no_proof_for(\+ ~path(6,8)).

no_proof_for(\+ ~path(6,8)).

no_proof_for(\+ ~path(6,8)).

result=failure.