1:- module(html_data, [inline_html_file//1]).

Deal with normal style html

*/

    6:- use_module(library(sgml), [load_html_file/2]).
 inline_html_file(+Specification)//
Insert everything in the body tag of a normal html file
author
- Jan
   16inline_html_file(Alias) -->
   17	{
   18	    absolute_file_name(Alias, Page, [access(read)]),
   19	    load_html_file(Page, DOM),
   20	    contains_term(element(body, _, Body), DOM),
   21	    Style = element(style, _, _),
   22	    findall(Style, sub_term(Style, DOM), Styles),
   23	    append(Styles, Body, Content)
   24	},
   25	html(Content)