This repository has been archived on 2023-08-20. You can view files and clone it, but cannot push or open issues or pull requests.
yap-6.3/packages/CLPBN/clpbn/bp.yap

190 lines
4.8 KiB
Plaintext
Raw Normal View History

/************************************************
Belief Propagation in CLP(BN)
**************************************************/
:- module(clpbn_bp,
[bp/3,
2011-12-10 22:58:43 +00:00
set_solver_parameter/2,
use_log_space/0,
init_bp_solver/4,
run_bp_solver/3,
finalize_bp_solver/1
]).
:- use_module(library('clpbn/dists'),
[dist/4,
get_dist_domain/2,
get_dist_domain_size/2,
get_dist_params/2
]).
:- use_module(library('clpbn/display'),
[clpbn_bind_vals/3]).
2011-12-27 22:07:42 +00:00
:- use_module(library('clpbn/aggregates'),
[check_for_agg_vars/2]).
:- use_module(library(atts)).
:- use_module(library(charsio)).
:- load_foreign_files(['horus'], [], init_predicates).
:- attribute id/1.
2011-12-10 22:58:43 +00:00
:- dynamic network_counting/1.
check_if_bp_done(_Var).
2011-12-10 22:58:43 +00:00
network_counting(0).
:- set_solver_parameter(run_mode, normal).
%:- set_solver_parameter(run_mode, convert).
%: -set_solver_parameter(run_mode, compress).
:- set_solver_parameter(schedule, seq_fixed).
%:- set_solver_parameter(schedule, seq_random).
%:- set_solver_parameter(schedule, parallel).
%:- set_solver_parameter(schedule, max_residual).
:- set_solver_parameter(accuracy, 0.0001).
:- set_solver_parameter(max_iter, 1000).
:- set_solver_parameter(always_loopy_solver, false).
% :- use_log_space.
bp([[]],_,_) :- !.
bp([QueryVars], AllVars, Output) :-
2011-12-10 22:58:43 +00:00
init_bp_solver(_, AllVars, _, BayesNet),
run_bp_solver([QueryVars], LPs, BayesNet),
finalize_bp_solver(BayesNet),
clpbn_bind_vals([QueryVars], LPs, Output).
2012-01-10 17:01:06 +00:00
init_bp_solver(_, AllVars0, _, bp(BayesNet, DistIds, _AllParFactors)) :-
2011-12-27 22:07:42 +00:00
check_for_agg_vars(AllVars0, AllVars),
2011-12-10 22:58:43 +00:00
%inc_network_counting,
2011-12-27 22:07:42 +00:00
%writeln_clpbn_vars(AllVars),
2011-12-10 22:58:43 +00:00
process_ids(AllVars, 0, DistIds0),
2011-12-27 22:07:42 +00:00
% generate_parfactors(AllVars, AllParFactors),
%writeln(AllParFactors),
2011-12-10 22:58:43 +00:00
get_vars_info(AllVars, VarsInfo),
sort(DistIds0, DistIds),
%(network_counting(0) -> writeln(vars:VarsInfo) ; true),
%(network_counting(0) -> writeln(distsids:DistIds) ; true),
create_network(VarsInfo, BayesNet).
%get_extra_vars_info(AllVars, ExtraVarsInfo),
%(network_counting(0) -> writeln(extra:ExtraVarsInfo) ; true),
%set_extra_vars_info(BayesNet, ExtraVarsInfo).
2011-12-27 22:07:42 +00:00
writeln_clpbn_vars(Var.AVars) :-
clpbn:get_atts(Var, [key(Key),dist(Dist,Parents)]),
parents_to_keys(Parents, Keys),
writeln(Var:Key:Dist:Keys),
writeln_clpbn_vars(AVars).
writeln_clpbn_vars([]).
parents_to_keys([], []).
parents_to_keys(Var.Parents, Key.Keys) :-
clpbn:get_atts(Var, [key(Key)]),
parents_to_keys(Parents, Keys).
process_ids([], _, []).
process_ids([V|Vs], VarId0, [DistId|DistIds]) :-
2011-12-10 22:58:43 +00:00
clpbn:get_atts(V, [dist(DistId, _)]), !,
put_atts(V, [id(VarId0)]),
VarId is VarId0 + 1,
process_ids(Vs, VarId, DistIds).
process_ids([_|Vs], VarId, DistIds) :-
2011-12-10 22:58:43 +00:00
process_ids(Vs, VarId, DistIds).
get_vars_info([], []).
get_vars_info([V|Vs], [var(VarId, DSize, Ev, ParentIds, DistId)|VarsInfo]) :-
2011-12-10 22:58:43 +00:00
clpbn:get_atts(V, [dist(DistId, Parents)]), !,
get_atts(V, [id(VarId)]),
get_dist_domain_size(DistId, DSize),
get_evidence(V, Ev),
vars2ids(Parents, ParentIds),
get_vars_info(Vs, VarsInfo).
get_vars_info([_|Vs], VarsInfo) :-
2011-12-10 22:58:43 +00:00
get_vars_info(Vs, VarsInfo).
vars2ids([], []).
vars2ids([V|QueryVars], [VarId|Ids]) :-
2011-12-10 22:58:43 +00:00
get_atts(V, [id(VarId)]),
vars2ids(QueryVars, Ids).
get_evidence(V, Ev) :-
2011-12-10 22:58:43 +00:00
clpbn:get_atts(V, [evidence(Ev)]), !.
2011-05-20 23:56:12 +01:00
get_evidence(_V, -1). % no evidence !!!
get_extra_vars_info([], []).
get_extra_vars_info([V|Vs], [v(VarId, Label, Domain)|VarsInfo]) :-
2011-12-10 22:58:43 +00:00
get_atts(V, [id(VarId)]), !,
clpbn:get_atts(V, [key(Key),dist(DistId, _)]),
term_to_atom(Key, Label),
get_dist_domain(DistId, Domain0),
numbers2atoms(Domain0, Domain),
get_extra_vars_info(Vs, VarsInfo).
get_extra_vars_info([_|Vs], VarsInfo) :-
get_extra_vars_info(Vs, VarsInfo).
numbers2atoms([], []).
numbers2atoms([Atom|L0], [Atom|L]) :-
2011-12-10 22:58:43 +00:00
atom(Atom), !,
numbers2atoms(L0, L).
numbers2atoms([Number|L0], [Atom|L]) :-
2011-12-10 22:58:43 +00:00
number_atom(Number, Atom),
numbers2atoms(L0, L).
2011-12-27 22:07:42 +00:00
run_bp_solver(QVsL0, LPs, bp(BayesNet, DistIds, _)) :-
2011-12-10 22:58:43 +00:00
get_dists_parameters(DistIds, DistsParams),
set_parameters(BayesNet, DistsParams),
process_query_list(QVsL0, QVsL),
%(network_counting(0) -> writeln(qvs:QVsL) ; true),
run_solver(BayesNet, QVsL, LPs).
process_query_list([], []).
process_query_list([[V]|QueryVars], [VarId|Ids]) :- !,
2011-12-10 22:58:43 +00:00
get_atts(V, [id(VarId)]),
process_query_list(QueryVars, Ids).
process_query_list([Vs|QueryVars], [VarIds|Ids]) :-
2011-12-10 22:58:43 +00:00
vars2ids(Vs, VarIds),
process_query_list(QueryVars, Ids).
get_dists_parameters([],[]).
get_dists_parameters([Id|Ids], [dist(Id, Params)|DistsInfo]) :-
2011-12-10 22:58:43 +00:00
get_dist_params(Id, Params),
get_dists_parameters(Ids, DistsInfo).
2011-12-27 22:07:42 +00:00
finalize_bp_solver(bp(BayesNet, _, _)) :-
2011-12-10 22:58:43 +00:00
free_bayesian_network(BayesNet).
2011-12-10 22:58:43 +00:00
inc_network_counting :-
retract(network_counting(Count0)),
Count is Count0 + 1,
assert(network_counting(Count)).