summaryrefslogtreecommitdiffstats
path: root/stdlib/array.ml
diff options
context:
space:
mode:
authorDamien Doligez <damien.doligez-inria.fr>2005-04-11 16:44:26 +0000
committerDamien Doligez <damien.doligez-inria.fr>2005-04-11 16:44:26 +0000
commitdac3ce381f772d6216c2e6efe8cc0d2584ee192b (patch)
treeb7b3a1e20a48a6838b230ebb9d3771c541e6611e /stdlib/array.ml
parentc13650d26e7c793f84c0aa369560b2b7f04d5835 (diff)
suppression d'espaces superflus
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@6834 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/array.ml')
-rw-r--r--stdlib/array.ml8
1 files changed, 4 insertions, 4 deletions
diff --git a/stdlib/array.ml b/stdlib/array.ml
index 0b021918f..4eb0cadf2 100644
--- a/stdlib/array.ml
+++ b/stdlib/array.ml
@@ -29,7 +29,7 @@ let init l f =
for i = 1 to pred l do
unsafe_set res i (f i)
done;
- res
+ res
let make_matrix sx sy init =
let res = create sx [||] in
@@ -54,8 +54,8 @@ let append a1 a2 =
let l1 = length a1 and l2 = length a2 in
if l1 = 0 && l2 = 0 then [||] else begin
let r = create (l1 + l2) (unsafe_get (if l1 > 0 then a1 else a2) 0) in
- for i = 0 to l1 - 1 do unsafe_set r i (unsafe_get a1 i) done;
- for i = 0 to l2 - 1 do unsafe_set r (i + l1) (unsafe_get a2 i) done;
+ for i = 0 to l1 - 1 do unsafe_set r i (unsafe_get a1 i) done;
+ for i = 0 to l2 - 1 do unsafe_set r (i + l1) (unsafe_get a2 i) done;
r
end
@@ -67,7 +67,7 @@ let concat_aux init al =
let res = create (size 0 al) init in
let rec fill pos = function
| [] -> ()
- | h::t ->
+ | h::t ->
for i = 0 to length h - 1 do
unsafe_set res (pos + i) (unsafe_get h i);
done;