Skip to content

Commit 4164179

Browse files
Jan WielemakerJan Wielemaker
Jan Wielemaker
authored and
Jan Wielemaker
committed
REINDENT: 4 spaces
1 parent 9608540 commit 4164179

34 files changed

+3287
-3221
lines changed

cgi.pl

+9-9
Original file line numberDiff line numberDiff line change
@@ -33,8 +33,8 @@
3333
*/
3434

3535
:- module(cgi,
36-
[ cgi_get_form/1 % -ListOf Name(Value)
37-
]).
36+
[ cgi_get_form/1 % -ListOf Name(Value)
37+
]).
3838
:- use_module(library(shlib)).
3939

4040
:- use_foreign_library(foreign(cgi), install_cgi).
@@ -74,12 +74,12 @@
7474
==
7575
*/
7676

77-
%% cgi_get_form(-Form)
77+
%! cgi_get_form(-Form)
7878
%
79-
% Decodes standard input and the environment variables to obtain a
80-
% list of arguments passed to the CGI script. This predicate both
81-
% deals with the CGI *GET* method as well as the *POST* method. If
82-
% the data cannot be obtained, an existence_error exception is
83-
% raised.
79+
% Decodes standard input and the environment variables to obtain a
80+
% list of arguments passed to the CGI script. This predicate both
81+
% deals with the CGI *GET* method as well as the *POST* method. If
82+
% the data cannot be obtained, an existence_error exception is
83+
% raised.
8484
%
85-
% @param Form is a list of Name(Value) terms.
85+
% @param Form is a list of Name(Value) terms.

crypt.pl

+5-5
Original file line numberDiff line numberDiff line change
@@ -33,12 +33,12 @@
3333
*/
3434

3535
:- module(crypt,
36-
[ crypt/2
37-
]).
36+
[ crypt/2
37+
]).
3838

3939
:- use_foreign_library(foreign(crypt), install_crypt).
4040

41-
% crypt(+Passwd, ?Encripted).
41+
% crypt(+Passwd, ?Encripted).
4242
%
43-
% Used to test an encrypted passwd or create one. In the latter
44-
% case, the first 2 letter must be instantiated
43+
% Used to test an encrypted passwd or create one. In the latter
44+
% case, the first 2 letter must be instantiated

0 commit comments

Comments
 (0)