ocaml/stdlib/string.ml

164 lines
4.9 KiB
OCaml
Raw Normal View History

(***********************************************************************)
(* *)
(* Objective Caml *)
(* *)
(* Xavier Leroy, projet Cristal, INRIA Rocquencourt *)
(* *)
(* Copyright 1996 Institut National de Recherche en Informatique et *)
(* Automatique. Distributed only by permission. *)
(* *)
(***********************************************************************)
(* $Id$ *)
(* String operations *)
external length : string -> int = "%string_length"
external get : string -> int -> char = "%string_safe_get"
external set : string -> int -> char -> unit = "%string_safe_set"
external create: int -> string = "create_string"
external unsafe_get : string -> int -> char = "%string_unsafe_get"
external unsafe_set : string -> int -> char -> unit = "%string_unsafe_set"
external unsafe_blit : string -> int -> string -> int -> int -> unit
= "blit_string" "noalloc"
external unsafe_fill : string -> int -> int -> char -> unit
= "fill_string" "noalloc"
let make n c =
let s = create n in
unsafe_fill s 0 n c;
s
let copy s =
let len = length s in
let r = create len in
unsafe_blit s 0 r 0 len;
r
let sub s ofs len =
if ofs < 0 or len < 0 or ofs + len > length s
then invalid_arg "String.sub"
else begin
let r = create len in
unsafe_blit s ofs r 0 len;
r
end
let fill s ofs len c =
if ofs < 0 or len < 0 or ofs + len > length s
then invalid_arg "String.fill"
else unsafe_fill s ofs len c
let blit s1 ofs1 s2 ofs2 len =
if len < 0 or ofs1 < 0 or ofs1 + len > length s1
or ofs2 < 0 or ofs2 + len > length s2
then invalid_arg "String.blit"
else unsafe_blit s1 ofs1 s2 ofs2 len
let concat sep l =
match l with
[] -> ""
| hd :: tl ->
let num = ref 0 and len = ref 0 in
List.iter (fun s -> incr num; len := !len + length s) l;
let r = create (!len + length sep * (!num - 1)) in
unsafe_blit hd 0 r 0 (length hd);
let pos = ref(length hd) in
List.iter
(fun s ->
unsafe_blit sep 0 r !pos (length sep);
pos := !pos + length sep;
unsafe_blit s 0 r !pos (length s);
pos := !pos + length s)
tl;
r
external is_printable: char -> bool = "is_printable"
external char_code: char -> int = "%identity"
external char_chr: int -> char = "%identity"
let escaped s =
let n = ref 0 in
for i = 0 to length s - 1 do
n := !n +
(match unsafe_get s i with
'"' | '\\' | '\n' | '\t' -> 2
| c -> if is_printable c then 1 else 4)
done;
if !n = length s then s else begin
let s' = create !n in
n := 0;
for i = 0 to length s - 1 do
begin
match unsafe_get s i with
('"' | '\\') as c ->
unsafe_set s' !n '\\'; incr n; unsafe_set s' !n c
| '\n' ->
unsafe_set s' !n '\\'; incr n; unsafe_set s' !n 'n'
| '\t' ->
unsafe_set s' !n '\\'; incr n; unsafe_set s' !n 't'
| c ->
if is_printable c then
unsafe_set s' !n c
else begin
let a = char_code c in
unsafe_set s' !n '\\';
incr n;
unsafe_set s' !n (char_chr (48 + a / 100));
incr n;
unsafe_set s' !n (char_chr (48 + (a / 10) mod 10));
incr n;
unsafe_set s' !n (char_chr (48 + a mod 10))
end
end;
incr n
done;
s'
end
let map f s =
let l = length s in
if l = 0 then s else begin
let r = create l in
for i = 0 to l - 1 do unsafe_set r i (f(unsafe_get s i)) done;
r
end
let uppercase s = map Char.uppercase s
let lowercase s = map Char.lowercase s
let apply1 f s =
if length s = 0 then s else begin
let r = copy s in
unsafe_set r 0 (f(unsafe_get s 0));
r
end
let capitalize s = apply1 Char.uppercase s
let uncapitalize s = apply1 Char.lowercase s
let rec index_rec s i c =
if i >= length s then raise Not_found
else if unsafe_get s i = c then i
else index_rec s (i+1) c
let index s c = index_rec s 0 c
let index_from s i c =
if i < 0 || i >= length s
then invalid_arg "String.index_from"
else index_rec s i c
let rec rindex_rec s i c =
if i < 0 then raise Not_found
else if unsafe_get s i = c then i
else rindex_rec s (i-1) c
let rindex s c = rindex_rec s (length s - 1) c
let rindex_from s i c =
if i < 0 || i >= length s
then invalid_arg "String.rindex_from"
else rindex_rec s i c