logicmoo_workspace
logicmoo_workspace copied to clipboard
logicmoo.base.examples.fol.EXACTLY_PUPPY_02 JUnit
(cd /var/lib/jenkins/workspace/logicmoo_workspace@2/packs_sys/logicmoo_base/t/examples/fol ; timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "['exactly_puppy_02.pfc.pl']")
% EDIT: https://github.com/logicmoo/logicmoo_workspace/edit/master/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl % JENKINS: https://jenkins.logicmoo.org/job/logicmoo_workspace/lastBuild/testReport/logicmoo.base.examples.fol/EXACTLY_PUPPY_02/ % ISSUE_SEARCH: https://github.com/logicmoo/logicmoo_workspace/issues?q=is%3Aissue+label%3AEXACTLY_PUPPY_02 % ISSUE: https://github.com/logicmoo/logicmoo_workspace/issues/452
%~ 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@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl'),
%~ this_test_might_need( :-( use_module( library(logicmoo_plarkc))))
:- user:use_module(library(editline)).
/*~
~*/
:- use_module(library(occurs)). % sub_term/2
/*~
~*/
% sub_term/2
:- use_module(library(sort)). % predsort/3
/*~
~*/
% predsort/3
:- use_module(library(backcomp)). % concat_atom/2
/*~
~*/
% concat_atom/2
:- user:autoload.
/*~
%~ message_hook_type(error)
%~ message_hook(
%~ error(existence_error(procedure,autoload/0),context(system:catch/3,Context_Kw)),
%~ error,
%~ [ '~q/~w: '-[catch,3], 'Unknown procedure: ~q'-[autoload/0],nl,
%~ ' However, there are definitions for:',nl,
%~ ' ~q'-[autoload/1],nl,
%~ ' ~q'-[autoload/2],nl])
catch/3: Unknown procedure: autoload/0
However, there are definitions for:
autoload/1
autoload/2
ERROR: catch/3: Unknown procedure: autoload/0
ERROR: However, there are definitions for:
ERROR: autoload/1
ERROR: autoload/2
%~ message_hook_type(warning)
%~ message_hook(
%~ goal_failed(directive,baseKB:user:autoload),
%~ warning,
%~ [ 'Goal (~w) failed: ~p' - [ directive,
%~ baseKB : user : autoload]])
Goal (directive) failed: baseKB:user:autoload
Warning: Goal (directive) failed: baseKB:user:autoload
~*/
:- module_transparent(system: = /2).
/*~
~*/
:- module_transparent('$attvar':'$wakeup'/1).
/*~
~*/
:- module_transparent('$attvar':'call_all_attr_uhooks'/2).
/*~
~*/
:- module_transparent('$attvar':'begin_call_all_attr_uhooks'/2).
/*~
~*/
:- module_transparent('$attvar':'uhook'/3).
/*~
~*/
:- '$current_source_module'(M),install_retry_undefined(M,error).
/*~
~*/
:- install_retry_undefined(user,error).
/*~
~*/
:- install_retry_undefined(kbii,error).
/*~
~*/
:- install_retry_undefined(kbi,error).
% :- set_prolog_flag(autoload,false).
/*~
~*/
% :- set_prolog_flag(autoload,false).
:- set_prolog_flag(retry_undefined, false).
/*~
~*/
:- set_prolog_flag(access_level, system).
% Option Examples: nesc($sentence), poss($sentence), poss($sentence)=>nesc($sentence).
% ==> feature_setting(default_modality,nesc($sentence)).
/*~
~*/
% Option Examples: nesc($sentence), poss($sentence), poss($sentence)=>nesc($sentence).
% ==> feature_setting(default_modality,nesc($sentence)).
/*
Feature Notes:
P. % P happens to be the feature_setting default_modality
poss(P). % possibly P
nesc(P). % necessarily P
~nesc(P). % not necessarily P
nesc(~P). % necessarily not P
~poss(P). % not possibly P
poss(~P). % possibly not P
poss(P)=>nesc(P). % P is true by default (allows other axioms to override)
poss(P)&~nesc(P). % possibly, but not necessarily P
~naf(P). % P is default
naf(~P). % possibly P
naf(P). % possibly not P
there are many Logically equivalent settings like
~poss(P) == nesc(~P)
falsify(~P) == poss(P) v nesc(P).
*/
test_sanity(G):- sanity(mpred_test(G)).
/*~
~*/
:- kbi_define(cute/1).
/*~
%~ kbi_define( baseKB : cute/1)
~*/
:- kbi_define(ugly/1).
/*~
%~ kbi_define( baseKB : ugly/1)
~*/
:- kb_shared(baseKB:cute/1).
/*~
~*/
:- kb_local(ugly/1).
/*~
~*/
:- kb_local(isa/2).
/*~
~*/
:- kbi_define(poss/1).
%===== axioms =======
% there are exactly 3 puppies total
/*~
%~ kbi_define( baseKB : poss/1)
~*/
%===== axioms =======
% there are exactly 3 puppies total
:- test_boxlog([+assert],exactly(3, X, puppy(X))).
% Ensure we can see them
/*~
%~ correct_special_quantifiers :- quant(exactly(3),X,puppy(X)).
%~ %~ correct_special_quantifiers:-quant(exactly(3),X,puppy(X))
%~ kifi = exactly(3,X,puppy(X)).
%~ /var/lib/jenkins/workspace/logicmoo_workspace@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl:71
%~ kifm = nesc( quant(exactly(3),X,puppy(X))).
%~ kif_to_boxlog_attvars2 = necessary(quant(exactly(3),'$VAR'('X'),puppy('$VAR'('X'))))
%~ w_o_c(
%~ error = error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),
%~ baseKB : kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,_542))
%~ FIlE: * https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl#L71
(0)$[system] system:'$c_call_prolog'. no(clause)
(1)$[$toplevel] '$toplevel':'$toplevel'. % toplevel.pl:701:
(2)$[$toplevel] '$toplevel':'$runtoplevel'. % toplevel.pl:713:
(10)$[system] system:'$load_file'('exactly_puppy_02.pfc.pl',user,'<gt;garbage_collected>'). % init.pl:2353:
(13)$[system]# system:'$sig_atomic'(setup_call_cleanup(with_mutex('$load_file','$mt_start_load'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',<gt;clause>(0x55e1f69b3100),[expand(false),expand(true)])),'$mt_do_load'(<gt;clause>(0x55e1f69b3100),'exactly_puppy_02.pfc.pl','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',user,[expand(false),expand(true)]),'$mt_end_load'(<gt;clause>(0x55e1f69b3100)))). no(clause)
(14)$[system] system:'$c_call_prolog'. no(clause)
(16)$[system]# system:setup_call_catcher_cleanup(system:with_mutex('$load_file','$mt_start_load'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',<gt;clause>(0x55e1f69b3100),[expand(false),expand(true)])),system:'$mt_do_load'(<gt;clause>(0x55e1f69b3100),'exactly_puppy_02.pfc.pl','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',user,[expand(false),expand(true)]),A,system:'$mt_end_load'(<gt;clause>(0x55e1f69b3100))). % init.pl:646:
(18)$[system]# system:'$qdo_load_file'('exactly_puppy_02.pfc.pl','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',user,[expand(false),expand(true)]). % init.pl:2546:
(21)<gt;*>$[system]# system:'$do_load_file_2'('exactly_puppy_02.pfc.pl','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',user,compiled,[expand(false),expand(true)]). % init.pl:2592:
(25)$[system]# system:setup_call_catcher_cleanup(system:'$start_consult'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',1632225664.8022604),system:'$load_file'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',A,[expand(false),expand(true)]),B,system:'$end_consult'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',lexstate(202,swi),user)). % init.pl:646:
(26)<gt;*>$[system]# system:'$load_file'('* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',A,[expand(false),expand(true)]). % init.pl:3007:
(27)$[system]# system:'$compile_term'('<gt;garbage_collected>','<gt;garbage_collected>','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl '). % init.pl:3074:
(28)$[system]# system:'$compile_term'('<gt;garbage_collected>','<gt;garbage_collected>','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl ',-). % init.pl:3084:
(29)$[system]# system:'$execute_directive'('<gt;garbage_collected>','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl '). % init.pl:3549:
(30)$[system]# system:'$execute_directive_2'('<gt;garbage_collected>','* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master@2/packs_sys/logicmoo_base/t/examples/fol/exactly_puppy_02.pfc.pl '). % init.pl:3571:
(31)<gt;*>$[system] system:'$execute_directive_3'(test_boxlog([+assert],exactly(3,A,puppy(A)))). % init.pl:3574:
(32)$[system] system:catch(baseKB:test_boxlog([+assert],exactly(3,A,puppy(A))),error(B,C),system:'$exception_in_directive'(error(B,C))). % init.pl:546:
(33)$[baseKB] common_logic_sanity:test_boxlog('<gt;garbage_collected>','<gt;garbage_collected>'). % common_logic_sanity.pl:143:
(34)$[baseKB] locally_each:locally_tl('<gt;garbage_collected>','<gt;garbage_collected>'). % redo_locally.pl:151:
(35)$[locally_each] locally_each:locally('<gt;garbage_collected>','<gt;garbage_collected>'). % redo_locally.pl:149:
(36)$[locally_each] locally_each:wtl(t_l,'<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % redo_locally.pl:199:
(37)$[locally_each] locally_each:wtl(t_l,'<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % redo_locally.pl:204:
(38)$[locally_each] locally_each:wtl_how('<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % redo_locally.pl:217:
(39)$[each_call_cleanup] each_call_cleanup:each_call_cleanup('<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % each_call.pl:147:
(40)$[each_call_cleanup] each_call_cleanup:trusted_redo_call_cleanup('<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % each_call.pl:116:
(41)$[system] system:setup_call_cleanup('<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % init.pl:650:
(42)$[system]# system:setup_call_catcher_cleanup(locally_each:key_asserta(t_l,t_l:kif_option_list([+assert])),each_call_cleanup:((baseKB:(\+ \+ (pretty_numbervars_ground(exactly(3,A,puppy(A)),exactly(3,X,puppy(X))),kif_optionally_e(never,ain,clif(exactly(3,X,puppy(X)))),kif_to_boxlog(exactly(3,X,puppy(X)),B),kif_optionally_e(true,show_boxlog,B),flush_output,kif_optionally(false,assert_to_boxlog,B),kif_optionally(false,print_boxlog_to_pfc,B))),deterministic(C)),(notrace(C==true)->!;mquietly(locally_each:key_erase(t_l)),notrace(nb_setarg(1,mquietly(locally_each:key_erase(t_l)),true));locally_each:key_asserta(t_l,t_l:kif_option_list([+assert])),notrace(nb_setarg(1,mquietly(locally_each:key_erase(t_l)),locally_each:key_erase(t_l))),notrace(fail))),D,each_call_cleanup:mquietly(locally_each:key_erase(t_l))). % init.pl:646:
(43)<gt;*>$[each_call_cleanup] system:'<gt;meta-call>'('<gt;garbage_collected>'). no(clause)
(44)$[ucatch]# ucatch:'<gt;garbage_collected>'. % ucatch.pl:1758:
(45)$[ucatch] ucatch:call_each_det('<gt;garbage_collected>','<gt;garbage_collected>'). % ucatch.pl:1775:
(46)$[ucatch] ucatch:call_each_det('<gt;garbage_collected>','<gt;garbage_collected>'). % ucatch.pl:1775:
(47)$[ucatch] ucatch:call_each_det(ucatch:must_det_u,'<gt;garbage_collected>'). % ucatch.pl:1775:
(48)$[ucatch] ucatch:call_each_det('<gt;garbage_collected>','<gt;garbage_collected>'). % ucatch.pl:1778:
(49)$[ucatch] ucatch:p_call('<gt;garbage_collected>','<gt;garbage_collected>'). % ucatch.pl:1784:
(50)$[ucatch]# ucatch:'<gt;garbage_collected>'. % ucatch.pl:1727:
(51)<gt;*>$[must_sanity]# must_sanity:baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),A). % must_sanity.pl:65:
(52)$[baseKB] common_logic_snark:kif_to_boxlog('<gt;garbage_collected>','<gt;garbage_collected>'). % common_logic_snark.pl:1099:
(53)<gt;*>$[must_sanity]# must_sanity:baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),A,rule1:0). % must_sanity.pl:65:
(54)$[baseKB] common_logic_snark:kif_to_boxlog('<gt;garbage_collected>','<gt;garbage_collected>','<gt;garbage_collected>'). % common_logic_snark.pl:1107:
(55)$[locally_each] locally_each:w_o_c('<gt;garbage_collected>'). % redo_locally.pl:86:
(56)$[system] system:catch(locally_each:w_o_c(error,baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A)),error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),locally_each:(wdmsg(w_o_c(error=error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))),dumpST,wdmsg(w_o_c(error=error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))),break,trace,baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))). % init.pl:546:
(57)$[locally_each] system:'<gt;meta-call>'(locally_each:(wdmsg(w_o_c(error=error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))),dumpST,wdmsg(w_o_c(error=error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))),break,trace,baseKB:kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,A))). no(clause)
(58)$[locally_each] dumpst:dumpST. % dumpst.pl:150:
%~ w_o_c(
%~ error = error(uninstantiation_error(X),context(put_attr/3,'1-st argument')),
%~ baseKB : kif_to_boxlog(exactly(3,X,puppy(X)),KB,rule1:0,_542))
% Break level 1
% Exit break level 1
^ Call: (58) [baseKB] common_logic_snark:kif_to_boxlog(exactly(3, X, puppy(X)), KB, rule1:0, _542) ? EOF: exit (status 4)
%~ unused(no_junit_results)
logicmoo.base.examples.fol.EXACTLY_PUPPY_02 JUnit error = catch/3: Unknown procedure: autoload/0
However, there are definitions for:
autoload/1
autoload/2
logicmoo.base.examples.fol.EXACTLY_PUPPY_02 JUnit warning = Goal (directive) failed: baseKB:user:autoload
%~ test_completed_exit(48)
%~ message_hook_type(warning)
%~ message_hook(
%~ goal_failed(at_halt,system:test_completed),
%~ warning,
%~ [ 'Goal (~w) failed: ~p' - [ at_halt,
%~ system : test_completed]])
Goal (at_halt) failed: system:test_completed
Warning: Goal (at_halt) failed: system:test_completed
totalTime=1.000
FAILED: /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-junit-minor -k exactly_puppy_02.pfc.pl (returned 4) Add_LABELS='' Rem_LABELS='Skipped,Skipped,Errors,Warnings,Overtime,Skipped'