summaryrefslogtreecommitdiffstats
path: root/stdlib/headernt.c
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/headernt.c')
-rw-r--r--stdlib/headernt.c64
1 files changed, 58 insertions, 6 deletions
diff --git a/stdlib/headernt.c b/stdlib/headernt.c
index a0c2d6454..c8529281b 100644
--- a/stdlib/headernt.c
+++ b/stdlib/headernt.c
@@ -4,30 +4,81 @@
/* */
/* Xavier Leroy, projet Cristal, INRIA Rocquencourt */
/* */
-/* Copyright 1996 Institut National de Recherche en Informatique et */
+/* Copyright 1998 Institut National de Recherche en Informatique et */
/* Automatique. Distributed only by permission. */
/* */
/***********************************************************************/
/* $Id$ */
+#include <string.h>
#include <wtypes.h>
#include <winbase.h>
#include <process.h>
+#include "../byterun/exec.h"
-char * runtime_name = "ocamlrun.exe";
-char * errmsg = "Cannot find ocamlrun.exe\n";
+#define MAXPATHLEN 1024 /*check*/
+
+static unsigned long read_size(char * ptr)
+{
+ unsigned char * p = (unsigned char *) ptr;
+ return ((unsigned long) p[0] << 24) + ((unsigned long) p[1] << 16) +
+ ((unsigned long) p[2] << 8) + p[3];
+}
+
+static int read_runtime_path(HANDLE h, char *runtime_path)
+{
+ char buffer[TRAILER_SIZE];
+ DWORD nread;
+ struct exec_trailer tr;
+ long size;
+
+ if (SetFilePointer(h, -TRAILER_SIZE, NULL, FILE_END) == -1) return -1;
+ if (! ReadFile(h, buffer, TRAILER_SIZE, nread, NULL)) return -1;
+ if (nread != TRAILER_SIZE) return -1;
+ tr.path_size = read_size(buffer);
+ tr.code_size = read_size(buffer + 4);
+ tr.prim_size = read_size(buffer + 8);
+ tr.data_size = read_size(buffer + 12);
+ tr.symbol_size = read_size(buffer + 16);
+ tr.debug_size = read_size(buffer + 20);
+ if (tr.path_size > sizeof(runtime_path)) return -1;
+ size = tr.path_size + tr.code_size + tr.prim_size +
+ tr.data_size + tr.symbol_size + tr.debug_size + TRAILER_SIZE;
+ if (SetFilePointer(h, -size, FILE_END) == -1) return -1;
+ if (! ReadFile(h, runtime_path, tr.path_size, &nread, NULL)) return -1;
+ if (nread != tr.path_size) return -1;
+ runtime_path[tr.path_size - 1] = 0;
+ return 0;
+}
+
+static void errwrite(char * msg)
+{
+ DWORD numwritten;
+ WriteFile(GetStdHandle(STD_ERROR_HANDLE), msg, strlen(msg),
+ &numwritten, NULL);
+}
int main(int argc, char ** argv)
{
- int retcode;
+ char * truename = GetModuleFileName();
char * cmdline = GetCommandLine();
- retcode = spawnlp(P_WAIT, runtime_name, cmdline, NULL);
+ char runtime_path[MAXPATHLEN];
+
+ h = CreateFile(truename, GENERIC_READ, 0, NULL, OPEN_EXISTING, 0, NULL);
+ if (h == INVALID_HANDLE_VALUE || read_runtime_path(h, runtime_path) == -1) {
+ errwrite(truename);
+ errwrite(" not found or is not a bytecode executable file\r\n");
+ return 2;
+ }
+ retcode = spawnlp(P_WAIT, runtime_path, cmdline, NULL);
/* We use P_WAIT instead of P_OVERLAY here because under NT,
P_OVERLAY returns to the command interpreter, displaying the prompt
before executing the command. */
if (retcode == -1) {
- write(2, errmsg, strlen(errmsg));
+ errwrite("Cannot exec ");
+ errwrite(runtime_path);
+ errwrite("\r\n");
return 2;
}
return retcode;
@@ -37,3 +88,4 @@ int main(int argc, char ** argv)
performs command-line processing (we don't need it) */
static void _setargv() { }
+