1:- module(test_plplot, [test_plplot/0]).
    2:- use_module(library(plunit)).
    3:- ensure_loaded(library(plplot)).
    4
    5test_plplot:-
    6    run_tests([basic]).
    7
    8:- begin_tests(basic, []).
    9
   10:-ensure_loaded(library(plplot)).
   11
   12test(plot_point):-
   13  plot_point('Title',[1.0, 2.0, 3.0, 4.0, 5.0],[5.0 ,3.0, 1.0, 3.0, 5.0]).
   14test(plot_lines):-
   15  plot_lines('Title',[1.0, 2.0, 3.0, 4.0, 5.0],[5.0 ,3.0, 1.0, 3.0, 5.0]).
   16
   17:- end_tests(basic).