summaryrefslogtreecommitdiffstats
path: root/stdlib/array.ml
diff options
context:
space:
mode:
authorXavier Leroy <xavier.leroy@inria.fr>1998-04-27 09:55:50 +0000
committerXavier Leroy <xavier.leroy@inria.fr>1998-04-27 09:55:50 +0000
commit95933de17c122f254bd91231d04b9cab89f134c3 (patch)
treedcb89d15970690700b3c6ccf95a5c4a0f3d8b3e6 /stdlib/array.ml
parent208be2cae2ec48293f30590ba9184f0e813402d2 (diff)
Corrections mineures sur la documentation
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@1933 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/array.ml')
-rw-r--r--stdlib/array.ml2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/array.ml b/stdlib/array.ml
index 3c012062b..0b753d3a3 100644
--- a/stdlib/array.ml
+++ b/stdlib/array.ml
@@ -50,7 +50,7 @@ let copy a =
let append a1 a2 =
let l1 = length a1 and l2 = length a2 in
- if l1 = 0 & l2 = 0 then [||] else begin
+ 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;