summaryrefslogtreecommitdiffstats
path: root/stdlib/set.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/set.ml')
-rw-r--r--stdlib/set.ml3
1 files changed, 2 insertions, 1 deletions
diff --git a/stdlib/set.ml b/stdlib/set.ml
index 1d049b139..5c6212d88 100644
--- a/stdlib/set.ml
+++ b/stdlib/set.ml
@@ -363,7 +363,8 @@ module Make(Ord: OrderedType) =
| 0, l -> Empty, l
| 1, x0 :: l -> Node (Empty, x0, Empty, 1), l
| 2, x0 :: x1 :: l -> Node (Node(Empty, x0, Empty, 1), x1, Empty, 2), l
- | 3, x0 :: x1 :: x2 :: l -> Node (Node(Empty, x0, Empty, 1), x1, Node(Empty, x2, Empty, 1), 2), l
+ | 3, x0 :: x1 :: x2 :: l ->
+ Node (Node(Empty, x0, Empty, 1), x1, Node(Empty, x2, Empty, 1), 2),l
| n, l ->
let nl = n / 2 in
let left, l = sub nl l in