SWI-Prolog / packages-http

The SWI-Prolog HTTP server and client libraries
23 stars 23 forks source link

After line 143, there should be a cut. Added a '!' #127

Closed xpxaxsxi closed 5 years ago

xpxaxsxi commented 5 years ago

I tested this '!' locally and it fixed a problem. I needed to change some use_module-predicates, to get my mime_pack2 to compile.

    POSSIBILITY OF SUCH DAMAGE.
*/

:- module(mime_pack2,
          [ mime_pack/3                 % +Input, +Stream, ?Boundary
          ]).
:- use_module(library(http/mimetype)).    % local file needed adding library() to work
:- use_module(library(http/html_write)).   % local file needed adding library() to work
:- use_module(library(lists)).
:- use_module(library(error)).

/** <module> Create a MIME message

Simple and partial implementation of MIM
xpxaxsxi commented 5 years ago

Fixed with https://github.com/SWI-Prolog/packages-http/commit/e4a2996673a9c3b27c78c91eb60770e98e6adb3b