Failed

logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02.logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02@Test_0003_Line_0000__H1_in_user: user:nesc(house(h1)) (from logicmoo.base.fol.fiveof.logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02)

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

Error Message

failure = "failure=info((why_was_true(user:(\\+nesc(house(h1)))),nop(ftrace(user:nesc(house(h1))))))\nno_proof_for(\\+nesc(house(h1))).\n\nno_proof_for(\\+nesc(house(h1))).\n\nno_proof_for(\\+nesc(house(h1))).\n\n". failure = []. 

Standard Error

name=Test_0003_Line_0000__H1_in_user
JUNIT_CLASSNAME='logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'five_leftof_type_02.pl\']"'.
 (cd /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/logicmoo_base/t/examples/fol/fiveof ; timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "['five_leftof_type_02.pl']")

```
%~ 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/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl'),
%~ this_test_might_need( :-( expects_dialect(pfc)))
%~ this_test_might_need( :-( use_module( library(logicmoo_plarkc))))

% =============================================
% File 'mpred_builtin.pfc'
% Purpose: Agent Reactivity for SWI-Prolog
% Maintainer: Douglas Miles
% Contact: $Author: dmiles $@users.sourceforge.net %
% Version: 'interface' 1.0.0
% Revision: $Revision: 1.9 $
% Revised At: $Date: 2002/06/27 14:13:20 $
% =============================================
%

% There are five houses in a row.
:- nop(module( baseKB)).

% makes the KB monotonic
/*~
~*/

% makes the KB monotonic
:- set_kif_option(qualify_modality,simple_nesc).

/*~
~*/

leftof(h1, h2).
/*~
%~ debugm(user,show_success(user,user:ain(clif(leftof(h1,h2)))))



=======================================================
leftof(h1,h2)
============================================

?- kif_to_boxlog( leftof(h1,h2) ).


% In English:
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  h1 leftof h2
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ kifi = leftof(h1,h2).
%~ kifm = nesc( leftof(h1,h2)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h1,h2))

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
% Results in the following 1 entailment(s):
nesc(leftof(h1,h2)).

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  it is necessarily true that h1 leftof h2
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc( leftof(h1,h2)).

============================================
~*/

leftof(h2, h3).
/*~
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl:21
%~ debugm(user,show_success(user,user:ain(clif(leftof(h2,h3)))))



=======================================================
leftof(h2,h3)
============================================

?- kif_to_boxlog( leftof(h2,h3) ).


% In English:
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  h2 leftof h3
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ kifi = leftof(h2,h3).
%~ kifm = nesc( leftof(h2,h3)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h2,h3))

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
% Results in the following 1 entailment(s):
nesc(leftof(h2,h3)).

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  it is necessarily true that h2 leftof h3
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc( leftof(h2,h3)).

============================================
~*/

leftof(h3, h4).
/*~
%~ debugm(user,show_success(user,user:ain(clif(leftof(h3,h4)))))



=======================================================
leftof(h3,h4)
============================================

?- kif_to_boxlog( leftof(h3,h4) ).


% In English:
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  h3 leftof h4
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ kifi = leftof(h3,h4).
%~ kifm = nesc( leftof(h3,h4)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h3,h4))

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
% Results in the following 1 entailment(s):
nesc(leftof(h3,h4)).

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  it is necessarily true that h3 leftof h4
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc( leftof(h3,h4)).

============================================
~*/

leftof(h4, h5).

% this should cause h1-h5 to become houses
/*~
%~ debugm(user,show_success(user,user:ain(clif(leftof(h4,h5)))))



=======================================================
leftof(h4,h5)
============================================

?- kif_to_boxlog( leftof(h4,h5) ).


% In English:
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  h4 leftof h5
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ kifi = leftof(h4,h5).
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl:23
%~ kifm = nesc( leftof(h4,h5)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h4,h5))

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
% Results in the following 1 entailment(s):
nesc(leftof(h4,h5)).

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  it is necessarily true that h4 leftof h5
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc( leftof(h4,h5)).

============================================
~*/

% this should cause h1-h5 to become houses
leftof(H1, H2) => house(H1) & house(H2).

/*~
%~ debugm(user,show_success(user,user:ain(clif((leftof(_829876,_829898)=>house(_829876)&house(_829898))))))



=======================================================
=>(leftof('$VAR'('House_Leftof'),'$VAR'('House_Leftof3')),&(house('$VAR'('House_Leftof')),house('$VAR'('House_Leftof3'))))
============================================

?- kif_to_boxlog( leftof(House_Leftof,House_Leftof3)=>house(House_Leftof)&house(House_Leftof3) ).


% In English:
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  If:
%~    ?House_Leftof leftof ?House_Leftof3 then it is
%~  Implied that:
%~    " ?House_Leftof isa house "  and
%~    " ?House_Leftof3 isa house "
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ kifm = ( leftof(House_Leftof,House_Leftof3) =>
%~          house(House_Leftof)&house(House_Leftof3)).
%~ kif_to_boxlog_attvars2 = =>(leftof('$VAR'('House_Leftof'),'$VAR'('House_Leftof3')),and(house('$VAR'('House_Leftof')),house('$VAR'('House_Leftof3'))))

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
% Results in the following 6 entailment(s):
nesc(leftof(House_Leftof,House_Leftof3))&nesc(~house(House_Leftof))==>nesc(~house(House_Leftof3)).
nesc(leftof(House_Leftof,House_Leftof3))&nesc(~house(House_Leftof3))==>nesc(~house(House_Leftof)).
nesc(leftof(House_Leftof,House_Leftof3))&poss(house(House_Leftof))==>nesc(house(House_Leftof3)).
nesc(leftof(House_Leftof,House_Leftof3))&poss(house(House_Leftof3))==>nesc(house(House_Leftof)).
poss(house(House_Leftof))&nesc(~house(House_Leftof3))==>nesc(~leftof(House_Leftof,House_Leftof3)).
poss(house(House_Leftof3))&nesc(~house(House_Leftof))==>nesc(~leftof(House_Leftof,House_Leftof3)).

%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily true  and
%~    " ?House_Leftof isa house " is necessarily false
%~  It's Proof that:
%~    " ?House_Leftof3 isa house " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( nesc(leftof(House_Leftof,House_Leftof3))&nesc(~house(House_Leftof)) ==>
  nesc( ~( house(House_Leftof3)))).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily true  and
%~    " ?House_Leftof3 isa house " is necessarily false
%~  It's Proof that:
%~    " ?House_Leftof isa house " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( nesc(leftof(House_Leftof,House_Leftof3))&nesc(~house(House_Leftof3)) ==>
  nesc( ~( house(House_Leftof)))).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily true  and
%~    " ?House_Leftof isa house " is possible
%~  It's Proof that:
%~    " ?House_Leftof3 isa house " is necessarily true
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( nesc(leftof(House_Leftof,House_Leftof3))&poss(house(House_Leftof)) ==>
  nesc( house(House_Leftof3))).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily true  and
%~    " ?House_Leftof3 isa house " is possible
%~  It's Proof that:
%~    " ?House_Leftof isa house " is necessarily true
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( nesc(leftof(House_Leftof,House_Leftof3))&poss(house(House_Leftof3)) ==>
  nesc( house(House_Leftof))).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof isa house " is possible  and
%~    " ?House_Leftof3 isa house " is necessarily false
%~  It's Proof that:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( poss(house(House_Leftof))&nesc(~house(House_Leftof3)) ==>
  nesc( ~( leftof(House_Leftof,House_Leftof3)))).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?House_Leftof3 isa house " is possible  and
%~    " ?House_Leftof isa house " is necessarily false
%~  It's Proof that:
%~    " ?House_Leftof leftof ?House_Leftof3 " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

( poss(house(House_Leftof3))&nesc(~house(House_Leftof)) ==>
  nesc( ~( leftof(House_Leftof,House_Leftof3)))).

============================================
%~ kifm = leftof(H1,H2)=>house(H1)&house(H2).
%~ kif_to_boxlog_attvars2 = =>(leftof('$VAR'('H1'),'$VAR'('H2')),and(house('$VAR'('H1')),house('$VAR'('H2'))))
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H2 isa house " is possible  and
%~    " ?H1 isa house " is necessarily false
%~  It's Proof that:
%~    " ?H1 leftof ?H2 " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

poss(house(H2))&nesc(~house(H1))==>nesc(~leftof(H1,H2)).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H1 leftof ?H2 " is necessarily true  and
%~    " ?H1 isa house " is necessarily false
%~  It's Proof that:
%~    " ?H2 isa house " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc(leftof(H1,H2))&nesc(~house(H1))==>nesc(~house(H2)).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H1 leftof ?H2 " is necessarily true  and
%~    " ?H2 isa house " is possible
%~  It's Proof that:
%~    " ?H1 isa house " is necessarily true
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc(leftof(H1,H2))&poss(house(H2))==>nesc(house(H1)).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H1 isa house " is possible  and
%~    " ?H2 isa house " is necessarily false
%~  It's Proof that:
%~    " ?H1 leftof ?H2 " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

poss(house(H1))&nesc(~house(H2))==>nesc(~leftof(H1,H2)).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H1 leftof ?H2 " is necessarily true  and
%~    " ?H2 isa house " is necessarily false
%~  It's Proof that:
%~    " ?H1 isa house " is necessarily false
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc(leftof(H1,H2))&nesc(~house(H2))==>nesc(~house(H1)).

%  AND
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
%~  Whenever:
%~    " ?H1 leftof ?H2 " is necessarily true  and
%~    " ?H1 isa house " is possible
%~  It's Proof that:
%~    " ?H2 isa house " is necessarily true
%~
%~ %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%

nesc(leftof(H1,H2))&poss(house(H1))==>nesc(house(H2)).

~*/

:- kif_compile.

% intractive_test/1 means only run if interactive
/*~
%~ kifi = leftof(h1,h2).
%~ kifm = nesc( leftof(h1,h2)).
%~ /var/lib/jenkins/workspace/logicmoo_workspace/packs_sys/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl:28
%~ kifi = leftof(h2,h3).
%~ kifm = nesc( leftof(h2,h3)).
%~ kifi = leftof(h3,h4).
%~ kifm = nesc( leftof(h3,h4)).
%~ kifi = leftof(h4,h5).
%~ kifm = nesc( leftof(h4,h5)).
%~ kifm = ( leftof(House_Leftof,House_Leftof1) =>
%~          house(House_Leftof)&house(House_Leftof1)).
%~ kifm = nesc( leftof(h1,h2)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h1,h2))
%~ kifm = nesc( leftof(h2,h3)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h2,h3))
%~ kifm = nesc( leftof(h3,h4)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h3,h4))
%~ kifm = nesc( leftof(h4,h5)).
%~ kif_to_boxlog_attvars2 = necessary(leftof(h4,h5))
%~ kifm = ( leftof(House_Leftof,House_Leftof1) =>
%~          house(House_Leftof)&house(House_Leftof1)).
%~ kif_to_boxlog_attvars2 = =>(leftof('$VAR'('House_Leftof'),'$VAR'('House_Leftof1')),and(house('$VAR'('House_Leftof')),house('$VAR'('House_Leftof1'))))
~*/

% intractive_test/1 means only run if interactive
:- interactive_test(listing(pfclog)).

% mpred_test/1 each become a Junit test that must succeed
/*~
%~ message_hook(
%~    error(existence_error(procedure,interactive_test/1),context(system:catch/3,Context_Kw)),
%~    error,
%~    [ '~q/~w: '-[catch,3],
%~      'Unknown procedure: ~q' - [ interactive_test/1]])
catch/3: Unknown procedure: interactive_test/1
ERROR: catch/3: Unknown procedure: interactive_test/1
%~ message_hook(
%~    goal_failed(directive,user:interactive_test(listing(pfclog))),
%~    warning,
%~    [ 'Goal (~w) failed: ~p' - [ directive,
%~                                 user : interactive_test( listing(pfclog))]])
Goal (directive) failed: user:interactive_test(listing(pfclog))
Warning: Goal (directive) failed: user:interactive_test(listing(pfclog))
~*/

% mpred_test/1 each become a Junit test that must succeed
:- mpred_test(pfclog_compile).

/*~
%~ ?-( mpred_test("Test_0001_Line_0000__Pfclog_compile_in_user",user:pfclog_compile)).
passed=info(why_was_true(user:pfclog_compile))
no_proof_for(pfclog_compile).

no_proof_for(pfclog_compile).

no_proof_for(pfclog_compile).

name='logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02-Test_0001_Line_0000__Pfclog_compile_in_user'.
JUNIT_CLASSNAME='logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/logicmoo_workspace/bin/lmoo-clif -t "[\'five_leftof_type_02.pl\']"'.
% saving_junit: /var/lib/jenkins/workspace/logicmoo_workspace/test_results/jenkins/Report-logicmoo-base-fol-fiveof-vSTARv0vSTARvvDOTvvSTARv-2-1--grep-2-i-WARN-ERROR-_file-00-fail-pass--Units-Logicmoo_base_fol_fiveof_FIVE_LEFTOF_TYPE_02_Test_0001_Line_0000_Pfclog_compile_in_user-junit.xml
~*/

:- mpred_test(pfclog_uncompile).
% This is the real test we care about here
/*~
%~ ?-( mpred_test("Test_0002_Line_0000__Pfclog_uncompile_in_user",user:pfclog_uncompile)).
%~ debugm( baseKB,
%~   show_success( baseKB,
%~     baseKB : mpred_withdraw( compiled_pfclog,
%~                ( mfl4(User,user,'* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master/packs_sys/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl ',36) ,
%~                  ax))))
:- dynamic pfclog/1.
:- multifile pfclog/1.
:- public pfclog/1.
:- module_transparent pfclog/1.

pfclog(nesc(leftof(h1, h2))).
pfclog(nesc(leftof(h2, h3))).
pfclog(nesc(leftof(h3, h4))).
pfclog(nesc(leftof(h4, h5))).
pfclog((poss(house(A)), nesc(~house(B))==>nesc(~leftof(B, A)))).
pfclog((nesc(leftof(A, B)), nesc(~house(A))==>nesc(~house(B)))).
pfclog((nesc(leftof(A, B)), poss(house(B))==>nesc(house(A)))).
pfclog((poss(house(A)), nesc(~house(B))==>nesc(~leftof(A, B)))).
pfclog((nesc(leftof(A, B)), nesc(~house(B))==>nesc(~house(A)))).
pfclog((nesc(leftof(A, B)), poss(house(A))==>nesc(house(B)))).

%~ debugm( baseKB,
%~   show_success( baseKB,
%~     baseKB : mpred_withdraw( compiled_pfclog,
%~                ( mfl4(User,user,'* https://logicmoo.org:2082/gitlab/logicmoo/logicmoo_workspace/-/edit/master/packs_sys/logicmoo_base/t/examples/fol/fiveof/five_leftof_type_02.pl ',36) ,
%~                  ax))))
passed=info(why_was_true(user:pfclog_uncompile))
no_proof_for(pfclog_uncompile).

:- dynamic pfclog/1.
:- multifile pfclog/1.
:- public pfclog/1.
:- module_transparent pfclog/1.

pfclog(nesc(leftof(h1, h2))).
pfclog(nesc(leftof(h2, h3))).
pfclog(nesc(leftof(h3, h4))).
pfclog(nesc(leftof(h4, h5))).
pfclog((poss(house(A)), nesc(~house(B))==>nesc(~leftof(B, A)))).
pfclog((nesc(leftof(A, B)), nesc(~house(A))==>nesc(~house(B)))).
pfclog((nesc(leftof(A, B)), poss(house(B))==>nesc(house(A)))).
pfclog((poss(house(A)), nesc(~house(B))==>nesc(~leftof(A, B)))).
pfclog((nesc(leftof(A, B)), nesc(~house(B))==>nesc(~house(A)))).
pfclog((nesc(leftof(A, B)), poss(house(A))==>nesc(house(B)))).

no_proof_for(pfclog_uncompile).

no_proof_for(pfclog_uncompile).

name='logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02-Test_0002_Line_0000__Pfclog_uncompile_in_user'.
JUNIT_CLASSNAME='logicmoo.base.fol.fiveof.FIVE_LEFTOF_TYPE_02'.
JUNIT_CMD='timeout --foreground --preserve-status -s SIGKILL -k 10s 10s swipl -x /var/lib/jenkins/workspace/log
goal=user:nesc(house(h1)).
time=0.0008418560028076172.
failure=failure=info((why_was_true(user:(\+nesc(house(h1)))),nop(ftrace(user:nesc(house(h1))))))
no_proof_for(\+nesc(house(h1))).

no_proof_for(\+nesc(house(h1))).

no_proof_for(\+nesc(house(h1))).

result=failure.