Failed

logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B.logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B@Test_0019_Line_0000__Ext_in_user: user:tFly(ext,iChilly) (from logicmoo.pfc.test.sanity_base.logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B)

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

Error Message

failure = "failure=info((why_was_true(user:(\\+tFly(ext,iChilly))),nop(ftrace(user:tFly(ext,iChilly)))))\nno_proof_for(\\+tFly(ext,iChilly)).\n\nno_proof_for(\\+tFly(ext,iChilly)).\n\nno_proof_for(\\+tFly(ext,iChilly)).\n\n". failure = []. 

Standard Error

name=Test_0019_Line_0000__Ext_in_user
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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 "['never_retract_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/never_retract_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)

:- expects_dialect(pfc).

/*~
~*/

(tType(COL)==>{kb_local(COL/2)},% functorDeclares(COL),
 (t(COL,ext,X)<gt;==>instanceOf(X,COL))).
 
/*~
~*/

 
tType(tFly).
/*~
~*/

tType(tCanary).
/*~
~*/

tType(tPenguin).
/*~
~*/

tType(tBird).

/*~
~*/


:- mpred_test(predicate_property(tBird(ext,_),dynamic)).

/*~
%~ ?-( mpred_test("Test_0001_Line_0000__Ext_in_user",user:predicate_property(tBird(ext,Bird_Ext),dynamic))).
passed=info(why_was_true(user:predicate_property(tBird(ext,_444),dynamic)))
no_proof_for(predicate_property(tBird(ext,Bird_Ext2),dynamic)).

no_proof_for(predicate_property(tBird(ext,Bird_Ext2),dynamic)).

no_proof_for(predicate_property(tBird(ext,Bird_Ext2),dynamic)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0001_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0001_Line_0000_Ext_in_user-junit.xml
~*/

subClassOf(C1,C2)==> (instanceOf(X,C1)==>instanceOf(X,C2)).

/*~
~*/

subClassOf(tCanary,tBird).
/*~
~*/

subClassOf(tPenguin,tBird).


/*~
~*/



:- dmsg("chilly is a penguin.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:48
%~ chilly is a penguin.
~*/

tPenguin(ext,iChilly).

/*~
~*/

:- mpred_test((tBird(ext,iChilly))).

/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:51
%~ ?-( mpred_test("Test_0002_Line_0000__Ext_in_user",user:tBird(ext,iChilly))).
passed=info(why_was_true(user:tBird(ext,iChilly)))
no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0002_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0002_Line_0000_Ext_in_user-junit.xml
~*/


:- dmsg("tweety is a canary.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:54
%~ tweety is a canary.
~*/

tCanary(ext,iTweety).

/*~
~*/

:- mpred_test((tBird(ext,iTweety))).

/*~
%~ ?-( mpred_test("Test_0003_Line_0000__Ext_in_user",user:tBird(ext,iTweety))).
passed=info(why_was_true(user:tBird(ext,iTweety)))
no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0003_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0003_Line_0000_Ext_in_user-junit.xml
~*/

:- dmsg("birds fly by default.").
/*~
%~ birds fly by default.
~*/

mdefault(( tBird(ext,X) ==> tFly(ext,X) )).

/*~
~*/

:- mpred_test((tBird(ext,iTweety))).
/*~
%~ ?-( mpred_test("Test_0004_Line_0000__Ext_in_user",user:tBird(ext,iTweety))).
passed=info(why_was_true(user:tBird(ext,iTweety)))
no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0004_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0004_Line_0000_Ext_in_user-junit.xml
~*/

:- mpred_test((tFly(ext,iTweety))).

/*~
%~ ?-( mpred_test("Test_0005_Line_0000__Ext_in_user",user:tFly(ext,iTweety))).
failure=info((why_was_true(user:(\+tFly(ext,iTweety))),nop(ftrace(user:tFly(ext,iTweety)))))
no_proof_for(\+tFly(ext,iTweety)).

no_proof_for(\+tFly(ext,iTweety)).

no_proof_for(\+tFly(ext,iTweety)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0005_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0005_Line_0000_Ext_in_user-junit.xml
~*/

:- dmsg("make sure chilly can fly").
/*~
%~ make sure chilly can fly
~*/

:- mpred_test((instanceOf(I,tFly),I=iChilly)).

/*~
%~ ?-( mpred_test("Test_0006_Line_0000__TFly_in_user",user:(instanceOf(I,tFly),I=iChilly))).
failure=info((why_was_true(user:(\+ (instanceOf(_102410,tFly),_102410=iChilly))),nop(ftrace(user:(instanceOf(_102410,tFly),_102410=iChilly)))))
no_proof_for(\+ (instanceOf(Chilly_Fly,tFly),Chilly_Fly=iChilly)).

no_proof_for(\+ (instanceOf(Chilly_Fly,tFly),Chilly_Fly=iChilly)).

no_proof_for(\+ (instanceOf(Chilly_Fly,tFly),Chilly_Fly=iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0006_Line_0000__TFly_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0006_Line_0000_TFly_in_user-junit.xml
~*/

:- mpred_test((tBird(ext,iTweety))).

/*~
%~ ?-( mpred_test("Test_0007_Line_0000__Ext_in_user",user:tBird(ext,iTweety))).
passed=info(why_was_true(user:tBird(ext,iTweety)))
no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

no_proof_for(tBird(ext,iTweety)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0007_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0007_Line_0000_Ext_in_user-junit.xml
~*/

:- listing([tFly/2,tBird/2,instanceOf/2]).

/*~
%~ skipped( listing( [ tFly/2, tBird/2,instanceOf/2]))
~*/


:- dmsg("make sure tweety can fly (and again chilly)").
/*~
%~ make sure tweety can fly (and again chilly)
~*/

:- mpred_test((tFly(ext,iTweety))).
/*~
%~ ?-( mpred_test("Test_0008_Line_0000__Ext_in_user",user:tFly(ext,iTweety))).
failure=info((why_was_true(user:(\+tFly(ext,iTweety))),nop(ftrace(user:tFly(ext,iTweety)))))
no_proof_for(\+tFly(ext,iTweety)).

no_proof_for(\+tFly(ext,iTweety)).

no_proof_for(\+tFly(ext,iTweety)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0008_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0008_Line_0000_Ext_in_user-junit.xml
~*/

:- mpred_test((tFly(ext,iChilly))).

/*~
%~ ?-( mpred_test("Test_0009_Line_0000__Ext_in_user",user:tFly(ext,iChilly))).
failure=info((why_was_true(user:(\+tFly(ext,iChilly))),nop(ftrace(user:tFly(ext,iChilly)))))
no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0009_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0009_Line_0000_Ext_in_user-junit.xml
~*/


never_retract_u(tBird(ext,iChilly)).

/*~
~*/


:- dmsg("penguins do not tFly.").
/*~
%~ penguins do not tFly.
~*/

tPenguin(ext,X) ==>  ~tFly(ext,X).

/*~
~*/

:- dmsg("confirm chilly now cant fly").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:84
%~ confirm chilly now cant fly
~*/

:- mpred_test((\+ tFly(ext,iChilly))).
/*~
%~ ?-( mpred_test("Test_0010_Line_0000__naf_Ext_in_user",user:(\+tFly(ext,iChilly)))).
passed=info(why_was_true(user:(\+tFly(ext,iChilly))))
no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0010_Line_0000__naf_Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0010_Line_0000_naf_Ext_in_user-junit.xml
~*/

:- mpred_test(( ~ tFly(ext,iChilly))).

%= repropigate that chilly was a bird again (actualy this asserts)

/*~
%~ ?-( mpred_test("Test_0011_Line_0000__Ext_in_user",user: ~tFly(ext,iChilly))).
failure=info((why_was_true(user:(\+ ~tFly(ext,iChilly))),nop(ftrace(user: ~tFly(ext,iChilly)))))
no_proof_for(\+ ~tFly(ext,iChilly)).

no_proof_for(\+ ~tFly(ext,iChilly)).

no_proof_for(\+ ~tFly(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0011_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0011_Line_0000_Ext_in_user-junit.xml
~*/

%= repropigate that chilly was a bird again (actualy this asserts)

tBird(ext,iChilly).

/*~
~*/

:- listing(tBird/2).

%= the dmsg explains the difference between \+ and ~
/*~
%~ skipped( listing( tBird/2))
~*/

%= the dmsg explains the difference between \+ and ~
:- dmsg("confirm chilly still does not fly").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:95
%~ confirm chilly still does not fly
~*/

:- mpred_test(( \+ tFly(ext,iChilly))).
/*~
%~ ?-( mpred_test("Test_0012_Line_0000__naf_Ext_in_user",user:(\+tFly(ext,iChilly)))).
passed=info(why_was_true(user:(\+tFly(ext,iChilly))))
no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0012_Line_0000__naf_Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0012_Line_0000_naf_Ext_in_user-junit.xml
~*/

:- dmsg("confirm chilly still cant fly").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:97
%~ confirm chilly still cant fly
~*/

:- mpred_test(( ~  tFly(ext,iChilly))).

/*~
%~ ?-( mpred_test("Test_0013_Line_0000__Ext_in_user",user: ~tFly(ext,iChilly))).
failure=info((why_was_true(user:(\+ ~tFly(ext,iChilly))),nop(ftrace(user: ~tFly(ext,iChilly)))))
no_proof_for(\+ ~tFly(ext,iChilly)).

no_proof_for(\+ ~tFly(ext,iChilly)).

no_proof_for(\+ ~tFly(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0013_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0013_Line_0000_Ext_in_user-junit.xml
~*/

/*

% This wounld be a good TMS test it should throw.. but right now it passes wrongly
tFly(ext,iChilly).

:- dmsg("confirm chilly is flying penguin").
:- mpred_test(( tFly(ext,iChilly))).
:- mpred_test(( tPenguin(ext,iChilly))).
:- mpred_test((\+ ~tFly(ext,iChilly))).

\+ tFly(ext,iChilly).

:- dmsg("confirm chilly is a normal penguin who cant fly").
:- mpred_test((\+ tFly(ext,iChilly))).

% fails rightly
:- mpred_test(( tPenguin(ext,iChilly))).

*/

:- dmsg("chilly is no longer a penguin (hopefly the assertion above about him being a bird wont be removed)").

/*~
%~ chilly is no longer a penguin (hopefly the assertion above about him being a bird wont be removed)
~*/


:- debug_logicmoo(_).
/*~
~*/

:- mpred_trace_exec.
/*~
~*/

:- debug_logicmoo(logicmoo(_)).

/*~
~*/

:- mpred_test(tBird(ext,iChilly)).

/*~
%~ ?-( mpred_test("Test_0014_Line_0000__Ext_in_user",user:tBird(ext,iChilly))).
passed=info(why_was_true(user:tBird(ext,iChilly)))
no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0014_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0014_Line_0000_Ext_in_user-junit.xml
~*/

never_retract_u(tBird(ext,iChilly)).

/*~
~*/


\+ tPenguin(ext,iChilly).                             

/*~
%~ debugm( baseKB,
%~   show_success( baseKB,
%~     baseKB : mpred_withdraw( tPenguin(ext,iChilly),
%~                ( mfl4(User,user,'* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc ',132) ,
%~                  ax))))
~*/
                             

:- mpred_test((tBird(ext,iChilly))).

/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/never_retract_01b.pfc:135
%~ ?-( mpred_test("Test_0015_Line_0000__Ext_in_user",user:tBird(ext,iChilly))).
passed=info(why_was_true(user:tBird(ext,iChilly)))
no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

no_proof_for(tBird(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0015_Line_0000__Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0015_Line_0000_Ext_in_user-junit.xml
~*/

:- mpred_test(( \+ tPenguin(ext,iChilly))).

/*~
%~ ?-( mpred_test("Test_0016_Line_0000__naf_Ext_in_user",user:(\+tPenguin(ext,iChilly)))).
passed=info(why_was_true(user:(\+tPenguin(ext,iChilly))))
no_proof_for(\+tPenguin(ext,iChilly)).

no_proof_for(\+tPenguin(ext,iChilly)).

no_proof_for(\+tPenguin(ext,iChilly)).

name='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B-Test_0016_Line_0000__naf_Ext_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.NEVER_RETRACT_01B'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'never_retract_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_NEVER_RETRACT_01B_Test_0016_Line_0000_naf_Ext_in_user-junit.xml
~*/

:- dmsg("chilly is still a bird").
/*~
%~ chilly is still a bird
~*/

:- mpred_test((tBird(ext,iChilly))).

goal=user:tFly(ext,iChilly).
time=0.0004210472106933594.
failure=failure=info((why_was_true(user:(\+tFly(ext,iChilly))),nop(ftrace(user:tFly(ext,iChilly)))))
no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

no_proof_for(\+tFly(ext,iChilly)).

result=failure.