From e82104a755463d481667650ba4f00de535048f39 Mon Sep 17 00:00:00 2001
From: Xavier Clerc <xavier.clerc@inria.fr>
Date: Mon, 9 Sep 2013 09:32:00 +0000
Subject: Remove labltk from the distribution (will be available as a
 third-party library).

git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@14077 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
---
 otherlibs/labltk/browser/useunix.ml | 69 -------------------------------------
 1 file changed, 69 deletions(-)
 delete mode 100644 otherlibs/labltk/browser/useunix.ml

(limited to 'otherlibs/labltk/browser/useunix.ml')

diff --git a/otherlibs/labltk/browser/useunix.ml b/otherlibs/labltk/browser/useunix.ml
deleted file mode 100644
index 86554d488..000000000
--- a/otherlibs/labltk/browser/useunix.ml
+++ /dev/null
@@ -1,69 +0,0 @@
-(*************************************************************************)
-(*                                                                       *)
-(*                         OCaml LablTk library                          *)
-(*                                                                       *)
-(*            Jacques Garrigue, Kyoto University RIMS                    *)
-(*                                                                       *)
-(*   Copyright 1999 Institut National de Recherche en Informatique et    *)
-(*   en Automatique and Kyoto University.  All rights reserved.          *)
-(*   This file is distributed under the terms of the GNU Library         *)
-(*   General Public License, with the special exception on linking       *)
-(*   described in file ../../../LICENSE.                                 *)
-(*                                                                       *)
-(*************************************************************************)
-
-(* $Id$ *)
-
-open StdLabels
-open UnixLabels
-
-let get_files_in_directory dir =
-  let len = String.length dir in
-  let dir =
-    if len > 0 && Sys.os_type = "Win32" &&
-     (dir.[len-1] = '/' || dir.[len-1] = '\\')
-    then String.sub dir ~pos:0 ~len:(len-1)
-    else dir
-  in match
-    try Some(opendir dir) with Unix_error _ -> None
-  with
-    None -> []
-  | Some dirh ->
-      let rec get_them l =
-        match
-          try Some(readdir dirh) with _ -> None
-        with
-        | Some x ->
-            get_them (x::l)
-        | None ->
-            closedir dirh; l
-      in
-      List.sort ~cmp:compare (get_them [])
-
-let is_directory name =
-  try
-    (stat name).st_kind = S_DIR
-  with _ -> false
-
-let concat dir name =
-  let len = String.length dir in
-  if len = 0 then name else
-  if dir.[len-1] = '/' then dir ^ name
-  else dir ^ "/" ^ name
-
-let get_directories_in_files ~path =
-  List.filter ~f:(fun x -> is_directory  (concat path x))
-
-(************************************************** Subshell call *)
-let subshell ~cmd =
-  let rc = open_process_in cmd in
-  let rec it l =
-    match
-      try Some(input_line rc) with _ -> None
-    with
-      Some x -> it (x::l)
-    | None -> List.rev l
-  in
-  let answer = it [] in
-  ignore (close_process_in rc);
-  answer
-- 
cgit v1.2.3-70-g09d2