(***********************************************************************) (* *) (* Objective Caml *) (* *) (* Xavier Leroy, projet Cristal, INRIA Rocquencourt *) (* *) (* Copyright 1996 Institut National de Recherche en Informatique et *) (* Automatique. Distributed only by permission. *) (* *) (***********************************************************************) (* $Id$ *) open Config open Clflags let process_interface_file name = Compile.interface name let process_implementation_file name = Compile.implementation name; objfiles := (Filename.chop_extension name ^ ".cmo") :: !objfiles let process_file name = if Filename.check_suffix name ".ml" or Filename.check_suffix name ".mlt" then begin Compile.implementation name; objfiles := (Filename.chop_extension name ^ ".cmo") :: !objfiles end else if Filename.check_suffix name ".mli" then Compile.interface name else if Filename.check_suffix name ".cmo" or Filename.check_suffix name ".cma" then objfiles := name :: !objfiles else if Filename.check_suffix name ext_obj or Filename.check_suffix name ext_lib then ccobjs := name :: !ccobjs else if Filename.check_suffix name ".c" then begin Compile.c_file name; ccobjs := (Filename.chop_suffix (Filename.basename name) ".c" ^ ext_obj) :: !ccobjs end else raise(Arg.Bad("don't know what to do with " ^ name)) let print_version_number () = print_string "The Objective Caml compiler, version "; print_string Config.version; print_newline() let usage = "Usage: ocamlc \noptions are:" let main () = try Arg.parse [ "-a", Arg.Set make_archive, " Build a library"; "-c", Arg.Set compile_only, " Compile only (do not link)"; "-cclib", Arg.String(fun s -> ccobjs := s :: !ccobjs), " Pass option to the C linker"; "-ccopt", Arg.String(fun s -> ccopts := s :: !ccopts), " Pass option to the C compiler and linker"; "-custom", Arg.Set custom_runtime, " Link in custom mode"; "-i", Arg.Set print_types, " Print the types"; "-I", Arg.String(fun dir -> include_dirs := dir :: !include_dirs), " Add to the list of include directories"; "-impl", Arg.String process_implementation_file, " Compile as a .ml file"; "-intf", Arg.String process_interface_file, " Compile as a .mli file"; "-linkall", Arg.Set link_everything, " Don't remove unused modules"; "-o", Arg.String(fun s -> exec_name := s; archive_name := s), " Set output file name to (default a.out)"; "-pp", Arg.String(fun s -> preprocessor := Some s), " Pipe sources through preprocessor "; "-thread", Arg.Set thread_safe, " Use thread-safe standard library"; "-v", Arg.Unit print_version_number, " Print compiler version number"; "-unsafe", Arg.Set fast, " No bound checking on array and string access"; "-nopervasives", Arg.Set nopervasives, " (undocumented)"; "-drawlambda", Arg.Set dump_rawlambda, " (undocumented)"; "-dlambda", Arg.Set dump_lambda, " (undocumented)"; "-dinstr", Arg.Set dump_instr, " (undocumented)"; "-", Arg.String process_file, " Treat as a file name (even if it starts with `-')" ] process_file usage; if !make_archive then begin Compile.init_path(); Bytelibrarian.create_archive (List.rev !objfiles) !archive_name end else if not !compile_only & !objfiles <> [] then begin Compile.init_path(); Bytelink.link (List.rev !objfiles) end; exit 0 with x -> Format.set_formatter_out_channel stderr; Errors.report_error x; exit 2 let _ = Printexc.catch main ()