@@ -31,6 +31,7 @@ open Ast_helper
31
31
let prefix_symbols = [ '!' ; '?' ; '~' ] ;;
32
32
let infix_symbols = [ '=' ; '<' ; '>' ; '@' ; '^' ; '|' ; '&' ; '+' ; '-' ; '*' ; '/' ;
33
33
'$' ; '%' ; '#' ]
34
+
34
35
(* type fixity = Infix| Prefix *)
35
36
let special_infix_strings =
36
37
[" asr" ; " land" ; " lor" ; " lsl" ; " lsr" ; " lxor" ; " mod" ; " or" ; " :=" ; " !=" ; " ::" ]
@@ -44,6 +45,7 @@ let fixity_of_string = function
44
45
| s when List. mem s special_infix_strings -> `Infix s
45
46
| s when List. mem s.[0 ] infix_symbols -> `Infix s
46
47
| s when List. mem s.[0 ] prefix_symbols -> `Prefix s
48
+ | s when s.[0 ] = '.' -> `Mixfix s
47
49
| _ -> `Normal
48
50
49
51
let view_fixity_of_exp = function
@@ -52,10 +54,13 @@ let view_fixity_of_exp = function
52
54
| _ -> `Normal
53
55
54
56
let is_infix = function | `Infix _ -> true | _ -> false
57
+ let is_mixfix = function `Mixfix _ -> true | _ -> false
55
58
56
59
(* which identifiers are in fact operators needing parentheses *)
57
60
let needs_parens txt =
58
- is_infix (fixity_of_string txt)
61
+ let fix = fixity_of_string txt in
62
+ is_infix fix
63
+ || is_mixfix fix
59
64
|| List. mem txt.[0 ] prefix_symbols
60
65
61
66
(* some infixes need spaces around parens to avoid clashes with comment
@@ -467,23 +472,24 @@ and sugar_expr ctxt f e =
467
472
| Pexp_apply ({ pexp_desc = Pexp_ident {txt = id; _};
468
473
pexp_attributes= [] ; _}, args)
469
474
when List. for_all (fun (lab , _ ) -> lab = Nolabel ) args -> begin
470
- match id, List. map snd args with
471
- | Lident "!" , [e] ->
472
- pp f " @[<hov>!%a@]" (simple_expr ctxt) e; true
473
- | Ldot (path , ("get" |"set" as func )), a :: other_args -> begin
474
- let print left right print_index indexes rem_args =
475
- match func, rem_args with
476
- | "get" , [] ->
475
+ let print a assign left right print_index indexes rem_args =
476
+ match assign, rem_args with
477
+ | true , [] ->
477
478
pp f " @[%a.%s%a%s@]"
478
479
(simple_expr ctxt) a
479
480
left (list ~sep: " ," print_index) indexes right; true
480
- | "set" , [v] ->
481
+ | false , [v] ->
481
482
pp f " @[%a.%s%a%s@ <-@;<1 2>%a@]"
482
483
(simple_expr ctxt) a
483
484
left (list ~sep: " ," print_index) indexes right
484
485
(simple_expr ctxt) v; true
485
- | _ -> false
486
- in
486
+ | _ -> false in
487
+ match id, List. map snd args with
488
+ | Lident "!" , [e] ->
489
+ pp f " @[<hov>!%a@]" (simple_expr ctxt) e; true
490
+ | Ldot (path , ("get" |"set" as func )), a :: other_args -> begin
491
+ let assign = func = " get" in
492
+ let print = print a assign in
487
493
match path, other_args with
488
494
| Lident "Array" , i :: rest ->
489
495
print " (" " )" (expression ctxt) [i] rest
@@ -500,6 +506,29 @@ and sugar_expr ctxt f e =
500
506
print " {" " }" (simple_expr ctxt) indexes rest
501
507
| _ -> false
502
508
end
509
+ | Lident s , a :: other_args when s.[0 ] = '.' ->
510
+ begin match other_args with
511
+ | i :: rest ->
512
+ let n = String. length s in
513
+ (* extract operator:
514
+ assignment operators end with [right_bracket ^ "<-"],
515
+ access operators end with [right_bracket] directly
516
+ *)
517
+ let assign =
518
+ s.[n - 1 ] = '-' in
519
+ let kind =
520
+ (* extract the right end bracket *)
521
+ if assign then s.[n - 3 ] else s.[n - 1 ] in
522
+ let left, right = match kind with
523
+ | ')' -> '(' , " )"
524
+ | ']' -> '[' , " ]"
525
+ | '}' -> '{' , " }"
526
+ | _ -> assert false in
527
+ let prefix = String. sub s 0 (1 + String. index s left) in
528
+ print a assign prefix right
529
+ (simple_expr ctxt) [i] rest
530
+ | _ -> false
531
+ end
503
532
| _ -> false
504
533
end
505
534
| _ -> false
0 commit comments