1:-use_module(library(auc)).    2
    3:- if(current_predicate(use_rendering/1)).    4:- use_rendering(c3).    5:- endif.    6
    7
    8main(AUCROC, ROC, AUCPR, PR):-
    9  compute_areas_diagrams(
   10    % list of couples prob-example where example is an atom for positive 
   11    % examples and \+(atom) for negative examples
   12    [0.7 - a, 0.7 - a, 0.7 - \+(a), 0.6 - a, 
   13     0.6 - \+(a), 0.5 - a, 0.4 - \+(a)],
   14    AUCROC, ROC, AUCPR, PR).

?- main(AUCROC, ROC, AUCPR, PR).

*/