1:- module( disp_bn, [disp_bn/1,disp_bn/2,bn_to_dot_dag/3,disp_bn_version/2] ).

Construct and display BN terms via graphviz

Construct and display graphs via graphviz. Originallly for Bayesian networks (thus the name) but can deal with all graph types supported via graphviz.

The dot executable from the graphviz distributions should be in your $PATH environment variable.

Only tested on Linux systems.

author
- nicos angelopoulos
version
- 0.1 2021/01/19
See also
- http://stoics.org.uk/~nicos/sware/contact.html

*/

   18:- use_module( library(lib) ).   19:- lib( source(disp_bn), homonyms(true) ).   20
   21:- lib( disp_bn/2 ).   22:- lib( bn_to_dot_dag/3 ).   23
   24:- lib(end(disp_bn)).
 disp_bn_version(-Vers, -Date)
Version Mj:Mn:Fx, and release date date(Y,M,D).
?- disp_bn_version( V, D ).
V = 0:1:0,
D = date(2021, 1, 19).
author
- Nicos Angelopoulos
version
- 0:1 2021/1/19
See also
- http://stoics.org.uk/~nicos/sware/packs/disp_bn

*/

   41disp_bn_version( 0:1:0, date(2021,1,19) ).
   42
   43
   44                 /*******************************
   45                 *            MESSAGES          *
   46                 *******************************/
   47:- multifile prolog:message//1.   48
   49prolog:message(disp_bn(Message)) -->
   50    message(Message).
   51
   52:- discontiguous
   53    message//1.   54
   55message( dot_off(Target) ) -->
   56    ['The dot executable is not installed, disp_bn/1 cannot process ~w'-[Target] ]