clean up spaces and tabs

git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@9547 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
master
Damien Doligez 2010-01-22 12:48:24 +00:00
parent bdc0fadee2
commit 04b1656222
586 changed files with 3091 additions and 3475 deletions

View File

@ -32,7 +32,7 @@ SHELL=/bin/sh
MKDIR=mkdir -p
INCLUDES=-I utils -I parsing -I typing -I bytecomp -I asmcomp -I driver \
-I toplevel
-I toplevel
UTILS=utils/misc.cmo utils/tbl.cmo utils/config.cmo \
utils/clflags.cmo utils/terminfo.cmo utils/ccomp.cmo utils/warnings.cmo \
@ -192,9 +192,9 @@ coldstart:
cd stdlib; $(MAKE) COMPILER=../boot/ocamlc all
cd stdlib; cp $(LIBFILES) ../boot
if test -f boot/libcamlrun.a; then :; else \
ln -s ../byterun/libcamlrun.a boot/libcamlrun.a; fi
ln -s ../byterun/libcamlrun.a boot/libcamlrun.a; fi
if test -d stdlib/caml; then :; else \
ln -s ../byterun stdlib/caml; fi
ln -s ../byterun stdlib/caml; fi
# Build the core system: the minimum needed to make depend and bootstrap
core: coldstart ocamlc ocamllex ocamlyacc ocamltools library
@ -240,7 +240,7 @@ compare:
@if cmp boot/ocamlc ocamlc && cmp boot/ocamllex lex/ocamllex \
&& cmp boot/ocamldep tools/ocamldep; \
then echo "Fixpoint reached, bootstrap succeeded."; \
else echo "Fixpoint not reached, try one more bootstrapping cycle."; \
else echo "Fixpoint not reached, try one more bootstrapping cycle."; \
fi
# Remove old bootstrap compilers
@ -262,9 +262,9 @@ opt:
# Native-code versions of the tools
opt.opt: checkstack runtime core ocaml opt-core ocamlc.opt otherlibraries \
ocamlbuild.byte camlp4out $(DEBUGGER) ocamldoc ocamlopt.opt \
otherlibrariesopt \
ocamllex.opt ocamltoolsopt.opt ocamlbuild.native camlp4opt ocamldoc.opt
ocamlbuild.byte camlp4out $(DEBUGGER) ocamldoc ocamlopt.opt \
otherlibrariesopt \
ocamllex.opt ocamltoolsopt.opt ocamlbuild.native camlp4opt ocamldoc.opt
# Installation
install:
@ -274,8 +274,8 @@ install:
if test -d $(MANDIR)/man$(MANEXT); then : ; \
else $(MKDIR) $(MANDIR)/man$(MANEXT); fi
cd $(LIBDIR); rm -f dllbigarray.so dlllabltk.so dllnums.so \
dllthreads.so dllunix.so dllgraphics.so dllmldbm.so dllstr.so \
dlltkanim.so
dllthreads.so dllunix.so dllgraphics.so dllmldbm.so dllstr.so \
dlltkanim.so
cd byterun; $(MAKE) install
cp ocamlc $(BINDIR)/ocamlc$(EXE)
cp ocaml $(BINDIR)/ocaml$(EXE)
@ -291,8 +291,8 @@ install:
cd tools; $(MAKE) install
-cd man; $(MAKE) install
for i in $(OTHERLIBRARIES); do \
(cd otherlibs/$$i; $(MAKE) install) || exit $$?; \
done
(cd otherlibs/$$i; $(MAKE) install) || exit $$?; \
done
cd ocamldoc; $(MAKE) install
if test -f ocamlopt; then $(MAKE) installopt; else :; fi
if test -f debugger/ocamldebug; then (cd debugger; $(MAKE) install); \
@ -369,28 +369,28 @@ otherlibs/dynlink/dynlink.cmxa: otherlibs/dynlink/natdynlink.ml
utils/config.ml: utils/config.mlp config/Makefile
@rm -f utils/config.ml
sed -e 's|%%LIBDIR%%|$(LIBDIR)|' \
-e 's|%%BYTERUN%%|$(BINDIR)/ocamlrun|' \
-e 's|%%CCOMPTYPE%%|cc|' \
-e 's|%%BYTECC%%|$(BYTECC) $(BYTECCCOMPOPTS) $(SHAREDCCCOMPOPTS)|' \
-e 's|%%NATIVECC%%|$(NATIVECC) $(NATIVECCCOMPOPTS)|' \
-e 's|%%PACKLD%%|$(PACKLD)|' \
-e 's|%%BYTECCLIBS%%|$(BYTECCLIBS)|' \
-e 's|%%NATIVECCLIBS%%|$(NATIVECCLIBS)|' \
-e 's|%%RANLIBCMD%%|$(RANLIBCMD)|' \
-e 's|%%CC_PROFILE%%|$(CC_PROFILE)|' \
-e 's|%%ARCH%%|$(ARCH)|' \
-e 's|%%MODEL%%|$(MODEL)|' \
-e 's|%%SYSTEM%%|$(SYSTEM)|' \
-e 's|%%EXT_OBJ%%|.o|' \
-e 's|%%EXT_ASM%%|.s|' \
-e 's|%%EXT_LIB%%|.a|' \
-e 's|%%EXT_DLL%%|.so|' \
-e 's|%%SYSTHREAD_SUPPORT%%|$(SYSTHREAD_SUPPORT)|' \
-e 's|%%ASM%%|$(ASM)|' \
-e 's|%%MKDLL%%|$(MKDLL)|' \
-e 's|%%MKEXE%%|$(MKEXE)|' \
-e 's|%%MKMAINDLL%%|$(MKMAINDLL)|' \
utils/config.mlp > utils/config.ml
-e 's|%%BYTERUN%%|$(BINDIR)/ocamlrun|' \
-e 's|%%CCOMPTYPE%%|cc|' \
-e 's|%%BYTECC%%|$(BYTECC) $(BYTECCCOMPOPTS) $(SHAREDCCCOMPOPTS)|' \
-e 's|%%NATIVECC%%|$(NATIVECC) $(NATIVECCCOMPOPTS)|' \
-e 's|%%PACKLD%%|$(PACKLD)|' \
-e 's|%%BYTECCLIBS%%|$(BYTECCLIBS)|' \
-e 's|%%NATIVECCLIBS%%|$(NATIVECCLIBS)|' \
-e 's|%%RANLIBCMD%%|$(RANLIBCMD)|' \
-e 's|%%CC_PROFILE%%|$(CC_PROFILE)|' \
-e 's|%%ARCH%%|$(ARCH)|' \
-e 's|%%MODEL%%|$(MODEL)|' \
-e 's|%%SYSTEM%%|$(SYSTEM)|' \
-e 's|%%EXT_OBJ%%|.o|' \
-e 's|%%EXT_ASM%%|.s|' \
-e 's|%%EXT_LIB%%|.a|' \
-e 's|%%EXT_DLL%%|.so|' \
-e 's|%%SYSTHREAD_SUPPORT%%|$(SYSTHREAD_SUPPORT)|' \
-e 's|%%ASM%%|$(ASM)|' \
-e 's|%%MKDLL%%|$(MKDLL)|' \
-e 's|%%MKEXE%%|$(MKEXE)|' \
-e 's|%%MKMAINDLL%%|$(MKMAINDLL)|' \
utils/config.mlp > utils/config.ml
@chmod -w utils/config.ml
partialclean::
@ -433,8 +433,8 @@ beforedepend:: parsing/linenum.ml
ocamlc.opt: $(COMPOBJS:.cmo=.cmx)
cd asmrun; $(MAKE) meta.o dynlink.o
$(CAMLOPT) $(LINKFLAGS) -ccopt "$(BYTECCLINKOPTS)" -o ocamlc.opt \
$(COMPOBJS:.cmo=.cmx) \
asmrun/meta.o asmrun/dynlink.o -cclib "$(BYTECCLIBS)"
$(COMPOBJS:.cmo=.cmx) \
asmrun/meta.o asmrun/dynlink.o -cclib "$(BYTECCLIBS)"
@sed -e 's|@compiler@|$$topdir/ocamlc.opt|' \
driver/ocamlcomp.sh.in > ocamlcomp.sh
@chmod +x ocamlcomp.sh
@ -459,7 +459,7 @@ $(OPTOBJS:.cmo=.cmx): ocamlopt
bytecomp/opcodes.ml: byterun/instruct.h
sed -n -e '/^enum/p' -e 's/,//g' -e '/^ /p' byterun/instruct.h | \
awk -f tools/make-opcodes > bytecomp/opcodes.ml
awk -f tools/make-opcodes > bytecomp/opcodes.ml
partialclean::
rm -f bytecomp/opcodes.ml
@ -475,9 +475,9 @@ bytecomp/runtimedef.ml: byterun/primitives byterun/fail.h
(echo 'let builtin_exceptions = [|'; \
sed -n -e 's|.*/\* \("[A-Za-z_]*"\) \*/$$| \1;|p' byterun/fail.h | \
sed -e '$$s/;$$//'; \
echo '|]'; \
echo 'let builtin_primitives = [|'; \
sed -e 's/.*/ "&";/' -e '$$s/;$$//' byterun/primitives; \
echo '|]'; \
echo 'let builtin_primitives = [|'; \
sed -e 's/.*/ "&";/' -e '$$s/;$$//' byterun/primitives; \
echo '|]') > bytecomp/runtimedef.ml
partialclean::
@ -531,7 +531,7 @@ beforedepend:: asmcomp/scheduling.ml
asmcomp/emit.ml: asmcomp/$(ARCH)/emit.mlp tools/cvt_emit
$(CAMLRUN) tools/cvt_emit < asmcomp/$(ARCH)/emit.mlp > asmcomp/emit.ml \
|| { rm -f asmcomp/emit.ml; exit 2; }
|| { rm -f asmcomp/emit.ml; exit 2; }
partialclean::
rm -f asmcomp/emit.ml
@ -555,7 +555,7 @@ partialclean::
runtime:
cd byterun; $(MAKE) all
if test -f stdlib/libcamlrun.a; then :; else \
ln -s ../byterun/libcamlrun.a stdlib/libcamlrun.a; fi
ln -s ../byterun/libcamlrun.a stdlib/libcamlrun.a; fi
clean::
cd byterun; $(MAKE) clean
@ -649,18 +649,18 @@ alldepend::
otherlibraries: ocamltools
for i in $(OTHERLIBRARIES); do \
(cd otherlibs/$$i; $(MAKE) RUNTIME=$(RUNTIME) all) || exit $$?; \
done
(cd otherlibs/$$i; $(MAKE) RUNTIME=$(RUNTIME) all) || exit $$?; \
done
otherlibrariesopt:
for i in $(OTHERLIBRARIES); do \
(cd otherlibs/$$i; $(MAKE) allopt) || exit $$?; \
done
(cd otherlibs/$$i; $(MAKE) allopt) || exit $$?; \
done
partialclean::
for i in $(OTHERLIBRARIES); do \
(cd otherlibs/$$i; $(MAKE) partialclean); \
done
(cd otherlibs/$$i; $(MAKE) partialclean); \
done
clean::
for i in $(OTHERLIBRARIES); do (cd otherlibs/$$i; $(MAKE) clean); done

View File

@ -29,7 +29,7 @@ DEPFLAGS=$(INCLUDES)
CAMLRUN=byterun/ocamlrun
INCLUDES=-I utils -I parsing -I typing -I bytecomp -I asmcomp -I driver \
-I toplevel
-I toplevel
UTILS=utils/misc.cmo utils/tbl.cmo utils/config.cmo \
utils/clflags.cmo utils/terminfo.cmo utils/ccomp.cmo utils/warnings.cmo \
@ -309,31 +309,31 @@ otherlibs/dynlink/dynlink.cmxa: otherlibs/dynlink/natdynlink.ml
utils/config.ml: utils/config.mlp config/Makefile
@rm -f utils/config.ml
sed -e "s|%%LIBDIR%%|$(LIBDIR)|" \
-e "s|%%BYTERUN%%|ocamlrun|" \
-e 's|%%CCOMPTYPE%%|$(CCOMPTYPE)|' \
-e "s|%%BYTECC%%|$(BYTECC) $(BYTECCCOMPOPTS)|" \
-e "s|%%NATIVECC%%|$(NATIVECC) $(NATIVECCCOMPOPTS)|" \
-e "s|%%PARTIALLD%%|$(PARTIALLD)|" \
-e "s|%%PACKLD%%|$(PACKLD)|" \
-e "s|%%BYTECCLIBS%%|$(BYTECCLIBS)|" \
-e "s|%%NATIVECCLIBS%%|$(NATIVECCLIBS)|" \
-e 's|%%RANLIBCMD%%|$(RANLIBCMD)|' \
-e 's|%%BINUTILS_NM%%|$(BINUTILS_NM)|' \
-e 's|%%BINUTILS_OBJCOPY%%|$(BINUTILS_OBJCOPY)|' \
-e "s|%%ARCH%%|$(ARCH)|" \
-e "s|%%MODEL%%|$(MODEL)|" \
-e "s|%%SYSTEM%%|$(SYSTEM)|" \
-e "s|%%EXT_OBJ%%|.$(O)|" \
-e "s|%%EXT_ASM%%|.$(S)|" \
-e "s|%%EXT_LIB%%|.$(A)|" \
-e "s|%%EXT_DLL%%|.dll|" \
-e "s|%%SYSTHREAD_SUPPORT%%|true|" \
-e 's|%%ASM%%|$(ASM)|' \
-e 's|%%MKDLL%%|$(MKDLL)|' \
-e 's|%%MKEXE%%|$(MKEXE)|' \
-e 's|%%MKMAINDLL%%|$(MKMAINDLL)|' \
-e 's|%%CC_PROFILE%%||' \
utils/config.mlp > utils/config.ml
-e "s|%%BYTERUN%%|ocamlrun|" \
-e 's|%%CCOMPTYPE%%|$(CCOMPTYPE)|' \
-e "s|%%BYTECC%%|$(BYTECC) $(BYTECCCOMPOPTS)|" \
-e "s|%%NATIVECC%%|$(NATIVECC) $(NATIVECCCOMPOPTS)|" \
-e "s|%%PARTIALLD%%|$(PARTIALLD)|" \
-e "s|%%PACKLD%%|$(PACKLD)|" \
-e "s|%%BYTECCLIBS%%|$(BYTECCLIBS)|" \
-e "s|%%NATIVECCLIBS%%|$(NATIVECCLIBS)|" \
-e 's|%%RANLIBCMD%%|$(RANLIBCMD)|' \
-e 's|%%BINUTILS_NM%%|$(BINUTILS_NM)|' \
-e 's|%%BINUTILS_OBJCOPY%%|$(BINUTILS_OBJCOPY)|' \
-e "s|%%ARCH%%|$(ARCH)|" \
-e "s|%%MODEL%%|$(MODEL)|" \
-e "s|%%SYSTEM%%|$(SYSTEM)|" \
-e "s|%%EXT_OBJ%%|.$(O)|" \
-e "s|%%EXT_ASM%%|.$(S)|" \
-e "s|%%EXT_LIB%%|.$(A)|" \
-e "s|%%EXT_DLL%%|.dll|" \
-e "s|%%SYSTHREAD_SUPPORT%%|true|" \
-e 's|%%ASM%%|$(ASM)|' \
-e 's|%%MKDLL%%|$(MKDLL)|' \
-e 's|%%MKEXE%%|$(MKEXE)|' \
-e 's|%%MKMAINDLL%%|$(MKMAINDLL)|' \
-e 's|%%CC_PROFILE%%||' \
utils/config.mlp > utils/config.ml
@chmod -w utils/config.ml
partialclean::
@ -394,7 +394,7 @@ $(OPTOBJS:.cmo=.cmx): ocamlopt
bytecomp/opcodes.ml: byterun/instruct.h
sed -n -e "/^enum/p" -e "s|,||g" -e "/^ /p" byterun/instruct.h | \
gawk -f tools/make-opcodes > bytecomp/opcodes.ml
gawk -f tools/make-opcodes > bytecomp/opcodes.ml
partialclean::
rm -f bytecomp/opcodes.ml
@ -410,9 +410,9 @@ bytecomp/runtimedef.ml: byterun/primitives byterun/fail.h
(echo 'let builtin_exceptions = [|'; \
sed -n -e 's|.*/\* \("[A-Za-z_]*"\) \*/$$| \1;|p' byterun/fail.h | \
sed -e '$$s/;$$//'; \
echo '|]'; \
echo 'let builtin_primitives = [|'; \
sed -e 's/.*/ "&";/' -e '$$s/;$$//' byterun/primitives; \
echo '|]'; \
echo 'let builtin_primitives = [|'; \
sed -e 's/.*/ "&";/' -e '$$s/;$$//' byterun/primitives; \
echo '|]') > bytecomp/runtimedef.ml
partialclean::

View File

@ -791,4 +791,3 @@ let end_assembly() =
if Config.system = "linux" then
(* Mark stack as non-executable, PR#4564 *)
` .section .note.GNU-stack,\"\",%progbits\n`

View File

@ -31,11 +31,11 @@ open Mach
rcx 5
r8 6
r9 7
r10 8
r11 9
r10 8
r11 9
rbp 10
r12 11
r13 12
r12 11
r13 12
r14 trap pointer
r15 allocation pointer

View File

@ -31,11 +31,11 @@ open Mach
rcx 5
r8 6
r9 7
r10 8
r11 9
r10 8
r11 9
rbp 10
r12 11
r13 12
r12 11
r13 12
r14 trap pointer
r15 allocation pointer

View File

@ -198,4 +198,3 @@ method insert_op_debug op dbg rs rd =
end
let fundecl f = (new selector)#emit_fundecl f

View File

@ -90,7 +90,7 @@ let compile_genfuns ppf f =
List.iter
(function
| (Cfunction {fun_name = name}) as ph when f name ->
compile_phrase ppf ph
compile_phrase ppf ph
| _ -> ())
(Cmmgen.generic_functions true [Compilenv.current_unit_infos ()])

View File

@ -71,4 +71,3 @@ let report_error ppf = function
fprintf ppf "Cannot find file %s" name
| Archiver_error name ->
fprintf ppf "Error while creating the library %s" name

View File

@ -85,8 +85,8 @@ let make_package_object ppf members targetobj targetname coercion =
then chop_extension_if_any targetobj ^ ".pack" ^ Config.ext_obj
else
(* Put the full name of the module in the temporary file name
to avoid collisions with MSVC's link /lib in case of successive
packs *)
to avoid collisions with MSVC's link /lib in case of successive
packs *)
Filename.temp_file (Compilenv.make_symbol (Some "")) Config.ext_obj in
let components =
List.map

View File

@ -15,4 +15,3 @@
(* Introduction of closures, uncurrying, recognition of direct calls *)
val intro: int -> Lambda.lambda -> Clambda.ulambda

View File

@ -129,4 +129,3 @@ type data_item =
type phrase =
Cfunction of fundecl
| Cdata of data_item list

View File

@ -115,4 +115,3 @@ type data_item =
type phrase =
Cfunction of fundecl
| Cdata of data_item list

View File

@ -1950,9 +1950,9 @@ let generic_functions shared units =
let (apply,send,curry) =
List.fold_left
(fun (apply,send,curry) ui ->
List.fold_right IntSet.add ui.Compilenv.ui_apply_fun apply,
List.fold_right IntSet.add ui.Compilenv.ui_send_fun send,
List.fold_right IntSet.add ui.Compilenv.ui_curry_fun curry)
List.fold_right IntSet.add ui.Compilenv.ui_apply_fun apply,
List.fold_right IntSet.add ui.Compilenv.ui_send_fun send,
List.fold_right IntSet.add ui.Compilenv.ui_curry_fun curry)
(IntSet.empty,IntSet.empty,IntSet.empty)
units in
let apply = if shared then apply else IntSet.union apply default_apply in

View File

@ -95,7 +95,3 @@ let file filename =
close_in ic; Parsecmmaux.report_error msg
| x ->
close_in ic; raise x

View File

@ -240,4 +240,3 @@ let report_error ppf = function
fprintf ppf "Corrupted compilation unit description@ %s" filename
| Illegal_renaming(modname, filename) ->
fprintf ppf "%s@ contains the description for unit@ %s" filename modname

View File

@ -106,5 +106,3 @@ type error =
exception Error of error
val report_error: Format.formatter -> error -> unit

View File

@ -28,4 +28,3 @@ val from_location: kind -> Location.t -> t
val from_call: Lambda.lambda_event -> t
val from_raise: Lambda.lambda_event -> t

View File

@ -189,4 +189,3 @@ let is_generic_function name =
List.exists
(fun p -> isprefix p name)
["caml_apply"; "caml_curry"; "caml_send"; "caml_tuplify"]

View File

@ -71,4 +71,3 @@ let print_specific_operation printreg op ppf arg =
| Ishift1add -> fprintf ppf "%a << 1 + %a" printreg arg.(0) printreg arg.(1)
| Ishift2add -> fprintf ppf "%a << 2 + %a" printreg arg.(0) printreg arg.(1)
| Ishift3add -> fprintf ppf "%a << 3 + %a" printreg arg.(0) printreg arg.(1)

View File

@ -151,4 +151,3 @@ let stack_alignment =
match Config.system with
| "macosx" -> 16
| _ -> 4

View File

@ -183,4 +183,4 @@ let contains_calls = ref false
let assemble_file infile outfile =
Ccomp.command (Config.asm ^
Filename.quote outfile ^ " " ^ Filename.quote infile ^
(if !Clflags.verbose then "" else ">NUL"))
(if !Clflags.verbose then "" else ">NUL"))

View File

@ -324,4 +324,3 @@ method emit_extcall_args env args =
end
let fundecl f = (new selector)#emit_fundecl f

View File

@ -52,4 +52,3 @@ type fundecl =
fun_fast: bool }
val fundecl: Mach.fundecl -> fundecl

View File

@ -129,4 +129,3 @@ let rec instr_iter f i =
| Iraise -> ()
| _ ->
instr_iter f i.next

View File

@ -90,4 +90,3 @@ val instr_cons_debug:
instruction_desc -> Reg.t array -> Reg.t array -> Debuginfo.t ->
instruction -> instruction
val instr_iter: (instruction -> unit) -> instruction -> unit

View File

@ -84,4 +84,3 @@ let print_specific_operation printreg op ppf arg =
printreg arg.(0) printreg arg.(1) printreg arg.(2)
| Ialloc_far n ->
fprintf ppf "alloc_far %d" n

View File

@ -63,4 +63,3 @@ method reload_retaddr_issue_cycles = 3
end
let fundecl f = (new scheduler)#schedule_fundecl f

View File

@ -15,4 +15,3 @@
(* Insert load/stores for pseudoregs that got assigned to stack locations. *)
val fundecl: Mach.fundecl -> Mach.fundecl * bool

View File

@ -62,4 +62,3 @@ method oper_issue_cycles = function
end
let fundecl f = (new scheduler)#schedule_fundecl f

View File

@ -400,4 +400,3 @@ let fundecl f =
fun_args = f.fun_args;
fun_body = new_body;
fun_fast = f.fun_fast }

View File

@ -222,4 +222,3 @@ CAMLprim value caml_get_exception_backtrace(value unit)
res = caml_alloc_small(1, 0); Field(res, 0) = arr; /* Some */
CAMLreturn(res);
}

View File

@ -176,7 +176,7 @@ L106:
L107:
; Pop the exception handler
pop _caml_exception_pointer
pop esi ; dummy register
pop esi ; dummy register
L109:
; Pop the callback link, restoring the global variables
; used by caml_c_call
@ -320,4 +320,3 @@ _caml_extra_params LABEL DWORD
BYTE 64 DUP (?)
END

View File

@ -418,4 +418,3 @@ caml_system__frametable:
.long .L105 + 4 /* return address into callback */
.short -1 /* negative size count => use callback link */
.short 0 /* no roots here */

Binary file not shown.

Binary file not shown.

View File

@ -8,5 +8,3 @@ sed -e 's/^\(.*\$([0-9]).*\)$/# \1/' \
-e 's/^FLEX.*$//g' \
-e 's/^\([^#=]*\)=\([^"]*\)$/if [ "x$\1" = "x" ]; then \1="\2"; fi/' \
config/Makefile > config/config.sh

View File

@ -7,9 +7,9 @@ if [ ! -x _build/ocamlbuild/ocamlbuildlight.byte ]; then
(cd ocamlbuild && make)
fi
mkdir -p _build/ocamlbuild
for i in "light.cmo" "light.byte" "lightlib.cma" "_plugin.cmi" "_pack.cmi"
for i in "light.cmo" "light.byte" "lightlib.cma" "_plugin.cmi" "_pack.cmi"
do
cp ocamlbuild/_build/ocamlbuild$i _build/ocamlbuild
cp ocamlbuild/_build/ocamlbuild$i _build/ocamlbuild
done
fi
rm -f ocamlbuild/myocamlbuild_config.ml ocamlbuild/myocamlbuild_config.mli

View File

@ -119,4 +119,3 @@ let report_error ppf = function
fprintf ppf "Cannot find file %s" name
| Not_an_object_file name ->
fprintf ppf "The file %s is not a bytecode object file" name

View File

@ -58,4 +58,3 @@ type library =
...
object code for last library member
library descriptor *)

View File

@ -172,4 +172,3 @@ let init_toplevel dllpath =
opened_dlls := Array.to_list (get_current_dlls());
names_of_opened_dlls := [];
linking_in_core := true

View File

@ -58,4 +58,3 @@ val init_compile: bool -> unit
contents of ld.conf file). Take note of the DLLs that were opened
when starting the running program. *)
val init_toplevel: string -> unit

View File

@ -423,5 +423,3 @@ and negate_comparison = function
| Ceq -> Cneq| Cneq -> Ceq
| Clt -> Cge | Cle -> Cgt
| Cgt -> Cle | Cge -> Clt

View File

@ -205,4 +205,3 @@ val staticfail : lambda (* Anticipated static failure *)
(* Check anticipated failure, substitute its final value *)
val is_guarded: lambda -> bool
val patch_guarded : lambda -> lambda -> lambda

View File

@ -2728,4 +2728,3 @@ let for_multiple_match loc paraml pat_act_list partial =
let paraml = List.map (fun (v,_) -> Lvar v) v_paraml in
List.fold_right bind_opt v_paraml
(do_for_multiple_match loc paraml pat_act_list partial)

View File

@ -17,10 +17,11 @@ external realloc_global_data : int -> unit = "caml_realloc_global"
external static_alloc : int -> string = "caml_static_alloc"
external static_free : string -> unit = "caml_static_free"
external static_resize : string -> int -> string = "caml_static_resize"
external static_release_bytecode : string -> int -> unit = "caml_static_release_bytecode"
external static_release_bytecode : string -> int -> unit
= "caml_static_release_bytecode"
type closure = unit -> Obj.t
external reify_bytecode : string -> int -> closure = "caml_reify_bytecode"
external invoke_traced_function : Obj.t -> Obj.t -> Obj.t -> Obj.t
= "caml_invoke_traced_function"
external get_section_table : unit -> (string * Obj.t) list
= "caml_get_section_table"
= "caml_get_section_table"

View File

@ -18,11 +18,12 @@ external global_data : unit -> Obj.t array = "caml_get_global_data"
external realloc_global_data : int -> unit = "caml_realloc_global"
external static_alloc : int -> string = "caml_static_alloc"
external static_free : string -> unit = "caml_static_free"
external static_release_bytecode : string -> int -> unit = "caml_static_release_bytecode"
external static_release_bytecode : string -> int -> unit
= "caml_static_release_bytecode"
external static_resize : string -> int -> string = "caml_static_resize"
type closure = unit -> Obj.t
external reify_bytecode : string -> int -> closure = "caml_reify_bytecode"
external invoke_traced_function : Obj.t -> Obj.t -> Obj.t -> Obj.t
= "caml_invoke_traced_function"
external get_section_table : unit -> (string * Obj.t) list
= "caml_get_section_table"
= "caml_get_section_table"

View File

@ -112,8 +112,8 @@ let transl_store_label_init glob size f arg =
(size+1,
Lsequence(
Lprim(Psetfield(size, false),
[Lprim(Pgetglobal glob, []);
Lprim (Pccall prim_makearray, [int !method_count; int 0])]),
[Lprim(Pgetglobal glob, []);
Lprim (Pccall prim_makearray, [int !method_count; int 0])]),
expr))
in
(size, transl_label_init expr)
@ -157,4 +157,3 @@ let oo_wrap env req f x =
wrapping := false;
top_env := Env.empty;
raise exn

View File

@ -308,4 +308,3 @@ CAMLprim value caml_get_exception_backtrace(value unit)
}
CAMLreturn(res);
}

View File

@ -182,13 +182,13 @@ caml_trace_value_file (value v, code_t prog, int proglen, FILE * f)
if (!v)
return;
if (prog && v % sizeof (int) == 0
&& (code_t) v >= prog
&& (code_t) v < (code_t) ((char *) prog + proglen))
&& (code_t) v >= prog
&& (code_t) v < (code_t) ((char *) prog + proglen))
fprintf (f, "=code@%d", (code_t) v - prog);
else if (Is_long (v))
fprintf (f, "=long%" ARCH_INTNAT_PRINTF_FORMAT "d", Long_val (v));
else if ((void*)v >= (void*)caml_stack_low
&& (void*)v < (void*)caml_stack_high)
&& (void*)v < (void*)caml_stack_high)
fprintf (f, "=stack_%d", (intnat*)caml_stack_high - (intnat*)v);
else if (Is_block (v)) {
int s = Wosize_val (v);
@ -202,10 +202,10 @@ caml_trace_value_file (value v, code_t prog, int proglen, FILE * f)
l = caml_string_length (v);
fprintf (f, "=string[s%dL%d]'", s, l);
for (i = 0; i < ((l>0x1f)?0x1f:l) ; i++) {
if (isprint (Byte (v, i)))
putc (Byte (v, i), f);
else
putc ('?', f);
if (isprint (Byte (v, i)))
putc (Byte (v, i), f);
else
putc ('?', f);
};
fprintf (f, "'");
goto displayfields;
@ -215,7 +215,7 @@ caml_trace_value_file (value v, code_t prog, int proglen, FILE * f)
case Double_array_tag:
fprintf (f, "=floatarray[s%d]", s);
for (i = 0; i < ((s>0xf)?0xf:s); i++)
fprintf (f, " %g", Double_field (v, i));
fprintf (f, " %g", Double_field (v, i));
goto displayfields;
case Abstract_tag:
fprintf (f, "=abstract[s%d]", s);
@ -227,25 +227,25 @@ caml_trace_value_file (value v, code_t prog, int proglen, FILE * f)
fprintf (f, "=block<T%d/s%d>", tg, s);
displayfields:
if (s > 0)
fputs ("=(", f);
fputs ("=(", f);
for (i = 0; i < s; i++) {
if (i > 20) {
fputs ("....", f);
break;
};
if (i > 0)
putc (' ', f);
fprintf (f, "%#lx", Field (v, i));
if (i > 20) {
fputs ("....", f);
break;
};
if (i > 0)
putc (' ', f);
fprintf (f, "%#lx", Field (v, i));
};
if (s > 0)
putc (')', f);
putc (')', f);
};
}
}
void
caml_trace_accu_sp_file (value accu, value * sp, code_t prog, int proglen,
FILE * f)
FILE * f)
{
int i;
value *p;

View File

@ -1030,8 +1030,8 @@ value caml_interprete(code_t prog, asize_t prog_size)
#define Lookup(obj, lab) Field (Field (obj, 0), Int_val(lab))
/* please don't forget to keep below code in sync with the
functions caml_cache_public_method and
caml_cache_public_method2 in obj.c */
functions caml_cache_public_method and
caml_cache_public_method2 in obj.c */
Instruct(GETMETHOD):
accu = Lookup(sp[0], accu);

View File

@ -180,7 +180,7 @@ CAMLprim value caml_format_int(value fmt, value arg)
value res;
buffer = parse_format(fmt, ARCH_INTNAT_PRINTF_FORMAT,
format_string, default_format_buffer, &conv);
format_string, default_format_buffer, &conv);
switch (conv) {
case 'u': case 'x': case 'X': case 'o':
sprintf(buffer, format_string, Unsigned_long_val(arg));

View File

@ -228,4 +228,3 @@ CAMLprim value caml_new_lex_engine(struct lexing_table *tbl, value start_state,
}
}
}

View File

@ -308,4 +308,3 @@ CAMLexport void caml_MD5Transform(uint32 *buf, uint32 *in)
buf[2] += c;
buf[3] += d;
}

View File

@ -69,4 +69,3 @@ extern int caml_executable_name(char * name, int name_len);
#endif
#endif /* CAML_OSDEPS_H */

View File

@ -101,4 +101,3 @@ CAMLexport void caml_do_local_roots (scanning_action f, value *stack_low,
}
}
}

View File

@ -153,4 +153,3 @@ CAMLprim value caml_bitvect_test(value bv, value n)
int pos = Int_val(n);
return Val_int(Byte_u(bv, pos >> 3) & (1 << (pos & 7)));
}

View File

@ -95,14 +95,14 @@ CAMLexport char * caml_search_exe_in_path(char * name)
while (1) {
fullname = stat_alloc(pathlen);
retcode = SearchPath(NULL, /* use system search path */
name,
".exe", /* add .exe extension if needed */
pathlen,
fullname,
&filepart);
name,
".exe", /* add .exe extension if needed */
pathlen,
fullname,
&filepart);
if (retcode == 0) {
caml_gc_message(0x100, "%s not found in search path\n",
(uintnat) name);
(uintnat) name);
strcpy(fullname, name);
break;
}

View File

@ -65,4 +65,3 @@ module Printers = struct
module DumpCamlp4Ast = Printers.DumpCamlp4Ast.Make Syntax;
module Null = Printers.Null.Make Syntax;
end;

View File

@ -167,4 +167,3 @@ value enable_dump_camlp4_ast_printer () =
value enable_null_printer () =
let module M = Printer PP.Null.Id PP.Null.Make in ();

View File

@ -91,4 +91,3 @@ value enable_ocamlr_printer : unit -> unit;
value enable_null_printer : unit -> unit;
value enable_dump_ocaml_ast_printer : unit -> unit;
value enable_dump_camlp4_ast_printer : unit -> unit;

View File

@ -1367,4 +1367,3 @@ module type SyntaxExtension = functor (Syn : Syntax)
and module Token = Syn.Token
and module Gram = Syn.Gram
and module Quotation = Syn.Quotation);

View File

@ -125,4 +125,3 @@ module Make (Ast : Sig.Camlp4Ast) = struct
value free_vars env_init e =
let fold = new fold_free_vars S.add ~env_init S.empty in (fold#expr e)#free;
end;

View File

@ -65,4 +65,3 @@ module Make (Structure : Structure.S) : sig
value continue_parser_of_entry :
internal_entry -> int -> Loc.t -> Action.t -> Context.t -> Stream.t (Token.t * Loc.t) -> Action.t;
end;

View File

@ -316,9 +316,9 @@ module Make (Syntax : Sig.Camlp4Syntax) = struct
[ [ "DEFINE"; i = uident; def = opt_macro_value -> SdDef i def
| "UNDEF"; i = uident -> SdUnd i
| "IFDEF"; uident_eval_ifdef; "THEN"; st1 = smlist_then; st2 = else_macro_def ->
make_SdITE_result st1 st2
make_SdITE_result st1 st2
| "IFNDEF"; uident_eval_ifndef; "THEN"; st1 = smlist_then; st2 = else_macro_def ->
make_SdITE_result st1 st2
make_SdITE_result st1 st2
| "INCLUDE"; fname = STRING ->
SdLazy (lazy (parse_include_file str_items fname)) ] ]
;
@ -352,23 +352,23 @@ module Make (Syntax : Sig.Camlp4Syntax) = struct
;
smlist_then:
[ [ sml = LIST1 [ d = macro_def; semi ->
execute_macro_if_active_branch _loc <:str_item<>> (fun a b -> <:str_item< $a$; $b$ >>) Then d
| si = str_item; semi -> SdStr si ] -> sml ] ]
execute_macro_if_active_branch _loc <:str_item<>> (fun a b -> <:str_item< $a$; $b$ >>) Then d
| si = str_item; semi -> SdStr si ] -> sml ] ]
;
smlist_else:
[ [ sml = LIST1 [ d = macro_def; semi ->
execute_macro_if_active_branch _loc <:str_item<>> (fun a b -> <:str_item< $a$; $b$ >>) Else d
| si = str_item; semi -> SdStr si ] -> sml ] ]
execute_macro_if_active_branch _loc <:str_item<>> (fun a b -> <:str_item< $a$; $b$ >>) Else d
| si = str_item; semi -> SdStr si ] -> sml ] ]
;
sglist_then:
[ [ sgl = LIST1 [ d = macro_def_sig; semi ->
execute_macro_if_active_branch _loc <:sig_item<>> (fun a b -> <:sig_item< $a$; $b$ >>) Then d
| si = sig_item; semi -> SdStr si ] -> sgl ] ]
execute_macro_if_active_branch _loc <:sig_item<>> (fun a b -> <:sig_item< $a$; $b$ >>) Then d
| si = sig_item; semi -> SdStr si ] -> sgl ] ]
;
sglist_else:
[ [ sgl = LIST1 [ d = macro_def_sig; semi ->
execute_macro_if_active_branch _loc <:sig_item<>> (fun a b -> <:sig_item< $a$; $b$ >>) Else d
| si = sig_item; semi -> SdStr si ] -> sgl ] ]
execute_macro_if_active_branch _loc <:sig_item<>> (fun a b -> <:sig_item< $a$; $b$ >>) Else d
| si = sig_item; semi -> SdStr si ] -> sgl ] ]
;
endif:
[ [ "END" -> ()

View File

@ -103,10 +103,10 @@ value wrap parse_fun =
value toplevel_phrase token_stream =
match Gram.parse_tokens_after_filter Syntax.top_phrase token_stream with
[ Some str_item ->
let str_item =
AstFilters.fold_topphrase_filters (fun t filter -> filter t) str_item
in
Ast2pt.phrase str_item
let str_item =
AstFilters.fold_topphrase_filters (fun t filter -> filter t) str_item
in
Ast2pt.phrase str_item
| None -> raise End_of_file ];

View File

@ -356,4 +356,3 @@ let just_doc () =
let doc () =
pack (); just_doc ()

View File

@ -21,4 +21,3 @@ value f e =
value print_expr = (new PP.printer ())#expr;
printf "%a@." print_expr (f <<let z = x + 2 in x + 2 * y * x * z>>);

View File

@ -17,4 +17,3 @@ AstFilters.register_str_item_filter begin fun st ->
<:str_item@ghost< try let module Main = struct $st$ end in ()
with e -> $global_handler_ref.val$ e >>
end;

View File

@ -10,4 +10,3 @@ let rec_nat =
let plus = << fun n -> fun m -> $rec_nat$ n (fun n -> fun p -> $succ$ p) m >>
let times = << fun n -> fun m -> $rec_nat$ n (fun n -> fun p -> $plus$ m p) $zero$ >>
let fact = << fun n -> $rec_nat$ n (fun n -> fun p -> $times$ ($succ$ n) p) $one$ >>

View File

@ -12,9 +12,9 @@ install-local:
$(MKDIR) $(MANDIR)/man1 ; \
cp $(TARGET) $(MANDIR)/man1/. ; \
for i in $(ALIASES); do \
rm -f $(MANDIR)/man1/$$i; \
echo '.so man1/$(TARGET)' > $(MANDIR)/man1/$$i; \
done; \
rm -f $(MANDIR)/man1/$$i; \
echo '.so man1/$(TARGET)' > $(MANDIR)/man1/$$i; \
done; \
fi
camlp4.1: camlp4.1.tpl

View File

@ -1 +0,0 @@

View File

@ -2,4 +2,3 @@ m.h
s.h
Makefile
config.sh

View File

@ -52,4 +52,3 @@ int main(void)
#endif
exit(res);
}

View File

@ -53,4 +53,3 @@ int main(void)
#endif
exit(res);
}

View File

@ -43,4 +43,3 @@
#define ARCH_INT64_PRINTF_FORMAT "I64"
#undef NONSTANDARD_DIV_MOD

View File

@ -14,4 +14,3 @@
UNIXDIR=../otherlibs/win32unix
include Makefile.shared

View File

@ -44,7 +44,7 @@ OTHEROBJS=\
OBJS=\
dynlink.cmo \
dynlink.cmo \
int64ops.cmo \
primitives.cmo \
unix_tools.cmo \

View File

@ -33,4 +33,3 @@ val checkpoint_big_step : int64 ref
val checkpoint_small_step : int64 ref
val checkpoint_max_count : int ref
val make_checkpoints : bool ref

View File

@ -27,4 +27,3 @@ val current_event : debug_event option ref
val get_current_event : unit -> debug_event
val current_event_is_before : unit -> bool

View File

@ -167,5 +167,3 @@ let report_error ppf = function
| No_active_printer lid ->
fprintf ppf "@[%a is not currently active as a printing function.@]@."
Printtyp.longident lid

View File

@ -31,4 +31,3 @@ type break_arg =
| BA_pos1 of Longident.t option * int * int option
(* break @ [MODULE] LINE [POS] *)
| BA_pos2 of Longident.t option * int (* break @ [MODULE] # OFFSET *)

View File

@ -106,4 +106,3 @@ let print_named_value max_depth exp env obj ppf ty =
print_value_name exp
Printtyp.type_expr ty
(print_value max_depth env obj) ty

View File

@ -33,4 +33,3 @@ let yes_or_no message =
raise x
else
false

View File

@ -1,2 +1 @@
ocamltags

View File

@ -30,28 +30,28 @@ SCRIPTDIR = $(BINDIR)
# Command for byte-compiling the files
COMPILECMD=(progn \
(setq load-path (cons "." load-path)) \
(byte-compile-file "caml-xemacs.el") \
(setq load-path (cons "." load-path)) \
(byte-compile-file "caml-xemacs.el") \
(byte-compile-file "caml-emacs.el") \
(byte-compile-file "caml.el") \
(byte-compile-file "inf-caml.el") \
(byte-compile-file "caml-help.el") \
(byte-compile-file "caml-types.el") \
(byte-compile-file "camldebug.el"))
(byte-compile-file "caml.el") \
(byte-compile-file "inf-caml.el") \
(byte-compile-file "caml-help.el") \
(byte-compile-file "caml-types.el") \
(byte-compile-file "camldebug.el"))
install:
@if test "$(EMACSDIR)" = ""; then \
set xxx `($(EMACS) --batch --eval "(mapcar 'print load-path)") \
2>/dev/null | \
sed -n -e '/\/site-lisp/s/"//gp'`; \
if test "$$2" = ""; then \
echo "Cannot determine Emacs site-lisp directory"; \
exit 2; \
fi; \
$(MAKE) EMACSDIR="$$2" simple-install; \
else \
$(MAKE) simple-install; \
fi
set xxx `($(EMACS) --batch --eval "(mapcar 'print load-path)") \
2>/dev/null | \
sed -n -e '/\/site-lisp/s/"//gp'`; \
if test "$$2" = ""; then \
echo "Cannot determine Emacs site-lisp directory"; \
exit 2; \
fi; \
$(MAKE) EMACSDIR="$$2" simple-install; \
else \
$(MAKE) simple-install; \
fi
# install the .el files, but do not compile them.
install-el:

View File

@ -39,4 +39,3 @@ only if necessary. It leaves point at end of indentation."
(defalias 'buffer-substring-no-properties 'buffer-substring)))
(provide 'caml-compat)

View File

@ -114,7 +114,7 @@
((fboundp 'global-font-lock-mode)
(make-local-variable 'font-lock-defaults)
(setq font-lock-defaults
'(caml-font-lock-keywords nil nil ((?' . "w") (?_ . "w")))))
'(caml-font-lock-keywords nil nil ((?' . "w") (?_ . "w")))))
(t
(setq font-lock-keywords caml-font-lock-keywords)))
(make-local-variable 'font-lock-keywords-only)

View File

@ -640,7 +640,8 @@ and according to visible modules. If this is still unsucessful, the user is
then prompted for a Module name.
The documentation for Module is first seach in the info manual if available,
then in the ``module.mli'' source file. The entry is then searched in the documentation.
then in the ``module.mli'' source file. The entry is then searched in the
documentation.
Visible modules are computed only once, at the first call.
Modules can be made visible explicitly with `ocaml-open-module' and

View File

@ -229,6 +229,3 @@ let compact_tables state_v =
reset_compact trans ;
reset_compact moves ;
tables

View File

@ -95,5 +95,3 @@ let env_to_array env = match env with
c)
rem ;
res

View File

@ -32,6 +32,3 @@ val inter : t -> t -> t
val diff : t -> t -> t
val complement : t -> t
val env_to_array : (t * 'a) list -> 'a array

View File

@ -58,4 +58,3 @@ type ('args,'action) automata_entry =
val make_dfa :
('args, 'action) Syntax.entry list ->
('args, 'action) automata_entry list * automata array

View File

@ -116,4 +116,3 @@ let main () =
exit 3
let _ = (* Printexc.catch *) main (); exit 0

View File

@ -29,5 +29,3 @@ val get : 'a t -> int -> 'a
val size : 'a t -> int

View File

@ -1,138 +0,0 @@
-
OCaml # Objective Caml toplevel
Usage: ocaml <options>
options are:
-I <dir> Add <dir> to the list of include directories
-unsafe No bound checking on array and string access
-drawlambda (undocumented)
-dlambda (undocumented)
-dinstr (undocumented)
-rectypes (undocumented)
-
OCamlc # Objective Caml compiler
Usage: ocamlc <options> <files>
Options are:
-a Build a library
-c Compile only (do not link)
-cc <comp> Use <comp> as the C compiler and linker
-cclib <opt> Pass option <opt> to the C linker
-ccopt <opt> Pass option <opt> to the C compiler and linker
-g Save debugging information
-i Print the types
-I <dir> Add <dir> to the list of include directories
-impl <file> Compile <file> as a .ml file
-intf <file> Compile <file> as a .mli file
-intf-suffix <file> Suffix for interface file (default: .mli)
-intf_suffix <file> (deprecated) same as -intf-suffix
-linkall Link all modules, even unused ones
-make-runtime Build a runtime system with given C objects and libraries
-make_runtime (deprecated) same as -make-runtime
-noassert Do not compile assertion checks
-o <file> Set output file name to <file>
-output-obj Output a C object file instead of an executable
-pp <command> Pipe sources through preprocessor <command>
-thread Use thread-safe standard library
-unsafe No bounds checking on array and string access
-use-runtime <path> Generate bytecode for the given runtime system
-use_runtime <path> (deprecated) same as -use-runtime
-v Print compiler version number
-verbose Print calls to external commands
-w <flags> Enable or disable warnings according to <flags>:
A/a enable/disable all warnings
C/c enable/disable suspicious comment
F/f enable/disable partially applied function
M/m enable/disable overriden method
P/p enable/disable partial match
S/s enable/disable non-unit statement
U/u enable/disable unused match case
V/v enable/disable hidden instance variable
X/x enable/disable all other warnings
default setting is A (all warnings enabled)
-nopervasives (undocumented)
-dparsetree (undocumented)
-drawlambda (undocumented)
-dlambda (undocumented)
-dinstr (undocumented)
-use-prims <file> (undocumented)
-rectypes (undocumented)
- <file> Treat <file> as a file name (even if it starts with `-')
-
OCamlc-custom # Objective Caml compiler for custom runtime mode
Usage: ocamlc-custom <options> <files>
Options are:
-a Build a library
-c Compile only (do not link)
-cc <comp> Use <comp> as the C compiler and linker
-cclib <opt> Pass option <opt> to the C linker
-ccopt <opt> Pass option <opt> to the C compiler and linker
-g Save debugging information
-i Print the types
-I <dir> Add <dir> to the list of include directories
-impl <file> Compile <file> as a .ml file
-intf <file> Compile <file> as a .mli file
-intf-suffix <file> Suffix for interface file (default: .mli)
-intf_suffix <file> (deprecated) same as -intf-suffix
-linkall Link all modules, even unused ones
-make-runtime Build a runtime system with given C objects and libraries
-make_runtime (deprecated) same as -make-runtime
-noassert Do not compile assertion checks
-o <file> Set output file name to <file>
-output-obj Output a C object file instead of an executable
-pp <command> Pipe sources through preprocessor <command>
-thread Use thread-safe standard library
-unsafe No bounds checking on array and string access
-use-runtime <path> Generate bytecode for the given runtime system
-use_runtime <path> (deprecated) same as -use-runtime
-v Print compiler version number
-verbose Print calls to external commands
-w <flags> Enable or disable warnings according to <flags>:
A/a enable/disable all warnings
C/c enable/disable suspicious comment
F/f enable/disable partially applied function
M/m enable/disable overriden method
P/p enable/disable partial match
S/s enable/disable non-unit statement
U/u enable/disable unused match case
V/v enable/disable hidden instance variable
X/x enable/disable all other warnings
default setting is A (all warnings enabled)
-nopervasives (undocumented)
-dparsetree (undocumented)
-drawlambda (undocumented)
-dlambda (undocumented)
-dinstr (undocumented)
-use-prims <file> (undocumented)
-rectypes (undocumented)
- <file> Treat <file> as a file name (even if it starts with `-')
-
OCamlDep # Objective Caml dependency generator
Usage: ocamldep [-I <dir>] <files>
-I <dir> Add <dir> to the list of include directories
-
OCamlLex # Objective Caml lexer generator
OCamlLex name.mll
-
OCamlRun # Objective Caml bytecode interpreter
OCamlRun [-v] file [argumentsÉ]
-v # print GC messages
Environment variable:
Set -e OCamlRunParam "<option>=<value>,É"
h # initial size of the major heap
i # minimum size increment for the major heap
l # maximum stack size
o # major GC speed setting
O # heap compaction trigger setting
s # size of the minor heap
v # verbosity flags for GC messages
-
OCamlYacc # Objective Caml parser generator
OCamlYacc [-v] [-b string] file.mly
-v # put verbose report in file.output
-b string # name output files string.ml and string.mli

View File

@ -42,4 +42,3 @@ val deps_of_tags : Tags.t -> pathname list
(** [dep tags deps] Will build [deps] when [tags] will be activated. *)
val dep : Tags.elt list -> pathname list -> unit

View File

@ -751,21 +751,21 @@ the tags \texttt{ocaml}, \texttt{native}, \texttt{byte}, \texttt{program},
\textbf{Tag} & \textbf{Display character} \\
\hline
\hline
ocaml & O \\
ocaml & O \\
\hline
native & N \\
native & N \\
\hline
byte & B \\
byte & B \\
\hline
program & P \\
program & P \\
\hline
pp & R \\
pp & R \\
\hline
debug & D \\
debug & D \\
\hline
interf & I \\
interf & I \\
\hline
link & L \\
link & L \\
\hline
\end{tabular}
\end{center}

View File

@ -137,4 +137,3 @@ let run_and_read cmd =
end
in loop 0; Buffer.contents totalbuf
end

View File

@ -28,8 +28,8 @@ let ocamldep_command' tags spec =
let menhir_ocamldep_command' tags ~menhir_spec ~ocamldep_spec out =
let menhir = if !Options.ocamlyacc = N then V"MENHIR" else !Options.ocamlyacc in
Cmd(S[menhir; T tags; A"--raw-depend";
A"--ocamldep"; Quote (ocamldep_command' tags ocamldep_spec);
menhir_spec ; Sh ">"; Px out])
A"--ocamldep"; Quote (ocamldep_command' tags ocamldep_spec);
menhir_spec ; Sh ">"; Px out])
let menhir_ocamldep_command arg out env _build =
let arg = env arg and out = env out in

View File

@ -41,4 +41,3 @@ val ocaml_lib :
?dir:Pathname.t ->
?tag_name:string ->
Pathname.t -> unit

Some files were not shown because too many files have changed in this diff Show More