1:- module(wl_windows, [popup//3]).
5:- use_module(library(http/html_write)). 6% :- use_module(library(option)). 7% :- use_module(library(http/http_wrapper), [http_current_request/1]). 8:- use_module(library(http/html_head)). 9 10:- html_meta popup(1, html, html, ?, ?). 11 12popup(Options, Activator, Popup) --> 13 { 14 call(Options, footnote) 15 }, 16 html([ 17 \html_requires(wl_window), 18 \html_requires(wl_window_css), 19 sup(class=[fn, footnote], [Activator, span(class(fnp), span(class(footcontain), Popup))]) 20 ]). 21popup(_, _, _) --> 22 html([ 23 p('missing required options in popup') 24 ])
Tools for making windows in the browser
*/