Failed

logicmoo.pfc.test.sanity_base.BIRDS_01D.logicmoo.pfc.test.sanity_base.BIRDS_01D@Test_0010_Line_0000__naf_IChilly_in_user: user:(\\+tFly(iChilly)) (from logicmoo.pfc.test.sanity_base.logicmoo.pfc.test.sanity_base.BIRDS_01D)

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

Error Message

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

Standard Error

name=Test_0010_Line_0000__naf_IChilly_in_user
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.BIRDS_01D'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'birds_01d.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 "['birds_01d.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/birds_01d.pfc'),
%~ this_test_might_need( :-( use_module( library(logicmoo_plarkc))))
%~ /var/lib/jenkins/.local/share/swi-prolog/pack/logicmoo_utils/prolog/logicmoo_test_header.pl:98
%~ 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/1)},
 functorDeclares(COL),
 (t(COL,X)<gt;==>instanceOf(X,COL))).

/*~
~*/

==> tType(tType).
/*~
~*/

==> tType(tFly).
/*~
~*/

==> tType(tCanary).
/*~
~*/

==> tType(tPenguin).
/*~
~*/

==> tType(tBird).

/*~
~*/


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

/*~
%~ ?-( mpred_test("Test_0001_Line_0000__tBird_1_in_user",user:predicate_property(tBird(Bird),dynamic))).
passed=info(why_was_true(user:predicate_property(tBird(_438),dynamic)))
no_proof_for(predicate_property(tBird(Bird1),dynamic)).

no_proof_for(predicate_property(tBird(Bird1),dynamic)).

no_proof_for(predicate_property(tBird(Bird1),dynamic)).

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

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

/*~
~*/


:- dmsg("A cannary is a type of bird.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:46
%~ A cannary is a type of bird.
~*/

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

:- dmsg("A penguin is a type of bird.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:48
%~ A penguin is a type of bird.
~*/

==> subClassOf(tPenguin,tBird).


/*~
~*/



:- dmsg("Chilly is a penguin.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:53
%~ Chilly is a penguin.
~*/

==> tPenguin(iChilly).

/*~
~*/

:- dmsg("Make sure Chilly is a bird now.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:56
%~ Make sure Chilly is a bird now.
~*/

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

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

no_proof_for(tBird(iChilly)).

no_proof_for(tBird(iChilly)).

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


:- dmsg("Tweety is a canary.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:60
%~ Tweety is a canary.
~*/

tCanary(iTweety).

/*~
~*/

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

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

no_proof_for(tBird(iTweety)).

no_proof_for(tBird(iTweety)).

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

:- dmsg("birds fly by default.").
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:65
%~ birds fly by default.
~*/

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

/*~
~*/

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

no_proof_for(tBird(iTweety)).

no_proof_for(tBird(iTweety)).

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

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

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

no_proof_for(tFly(iTweety)).

no_proof_for(tFly(iTweety)).

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

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

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

/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/pfc/t/sanity_base/birds_01d.pfc:72
%~ ?-( mpred_test("Test_0006_Line_0000__TFly_in_user",user:(instanceOf(I,tFly),I=iChilly))).
passed=info(why_was_true(user:(instanceOf(iChilly,tFly),iChilly=iChilly)))
no_proof_for((instanceOf(iChilly,tFly),iChilly=iChilly)).

no_proof_for((instanceOf(iChilly,tFly),iChilly=iChilly)).

no_proof_for((instanceOf(iChilly,tFly),iChilly=iChilly)).

name='logicmoo.pfc.test.sanity_base.BIRDS_01D-Test_0006_Line_0000__TFly_in_user'.
JUNIT_CLASSNAME='logicmoo.pfc.test.sanity_base.BIRDS_01D'.
JUNIT_CMD='timeou
goal=user:(\+tFly(iChilly)).
time=0.00036215782165527344.
failure=failure=info((why_was_true(user:tFly(iChilly)),nop(ftrace(user:(\+tFly(iChilly))))))
no_proof_for(tFly(iChilly)).

no_proof_for(tFly(iChilly)).

no_proof_for(tFly(iChilly)).

result=failure.