Skip to content

Commit 80af632

Browse files
committed
Wrap (a -> b) into literals instead of plain lists, closes #13358
1 parent 129c5be commit 80af632

File tree

4 files changed

+67
-21
lines changed

4 files changed

+67
-21
lines changed

lib/elixir/lib/code/formatter.ex

+6-5
Original file line numberDiff line numberDiff line change
@@ -367,6 +367,11 @@ defmodule Code.Formatter do
367367
tuple_to_algebra(meta, [left, right], :flex_break, state)
368368
end
369369

370+
# (left -> right)
371+
defp quoted_to_algebra({:__block__, _, [[{:->, _, _} | _] = clauses]}, _context, state) do
372+
paren_fun_to_algebra(clauses, @max_line, @min_line, state)
373+
end
374+
370375
defp quoted_to_algebra({:__block__, meta, [list]}, _context, state) when is_list(list) do
371376
case meta[:delimiter] do
372377
~s['''] ->
@@ -417,6 +422,7 @@ defmodule Code.Formatter do
417422
{Keyword.fetch!(meta, :token) |> float_to_algebra(state.inspect_opts), state}
418423
end
419424

425+
# (unquote_splicing(...))
420426
defp quoted_to_algebra(
421427
{:__block__, _meta, [{:unquote_splicing, meta, [_] = args}]},
422428
context,
@@ -505,11 +511,6 @@ defmodule Code.Formatter do
505511
remote_to_algebra(quoted, context, state)
506512
end
507513

508-
# (left -> right)
509-
defp quoted_to_algebra([{:->, _, _} | _] = clauses, _context, state) do
510-
paren_fun_to_algebra(clauses, @max_line, @min_line, state)
511-
end
512-
513514
# [keyword: :list] (inner part)
514515
# %{:foo => :bar} (inner part)
515516
defp quoted_to_algebra(list, context, state) when is_list(list) do

lib/elixir/lib/code/normalizer.ex

-5
Original file line numberDiff line numberDiff line change
@@ -137,11 +137,6 @@ defmodule Code.Normalizer do
137137
{:., meta, [left, right]}
138138
end
139139

140-
# A list of left to right arrows is not considered as a list literal, so it's not wrapped
141-
defp do_normalize([{:->, _, [_ | _]} | _] = quoted, state) do
142-
normalize_args(quoted, state)
143-
end
144-
145140
# left -> right
146141
defp do_normalize({:->, meta, [left, right]}, state) do
147142
meta = patch_meta_line(meta, state.parent_meta)

lib/elixir/src/elixir_parser.yrl

+10-10
Original file line numberDiff line numberDiff line change
@@ -789,12 +789,14 @@ adjust_map_column(Map) ->
789789

790790
%% Blocks
791791

792-
build_block([{unquote_splicing, _, [_]}]=Exprs) ->
793-
{'__block__', [], Exprs};
794-
build_block([Expr]) ->
792+
build_block(Exprs) -> build_block(Exprs, []).
793+
794+
build_block([{unquote_splicing, _, [_]}]=Exprs, Meta) ->
795+
{'__block__', Meta, Exprs};
796+
build_block([Expr], _Meta) ->
795797
Expr;
796-
build_block(Exprs) ->
797-
{'__block__', [], Exprs}.
798+
build_block(Exprs, Meta) ->
799+
{'__block__', Meta, Exprs}.
798800

799801
%% Newlines
800802

@@ -1072,11 +1074,9 @@ build_stab(Stab) ->
10721074
build_paren_stab(_Before, [{Op, _, [_]}]=Exprs, _After) when ?rearrange_uop(Op) ->
10731075
{'__block__', [], Exprs};
10741076
build_paren_stab(Before, Stab, After) ->
1075-
case build_stab(Stab) of
1076-
{'__block__', Meta, Block} ->
1077-
{'__block__', Meta ++ meta_from_token_with_closing(Before, After), Block};
1078-
Other ->
1079-
Other
1077+
case check_stab(Stab, none) of
1078+
block -> build_block(reverse(Stab), meta_from_token_with_closing(Before, After));
1079+
stab -> handle_literal(collect_stab(Stab, [], []), Before, newlines_pair(Before, After))
10801080
end.
10811081

10821082
collect_stab([{'->', Meta, [Left, Right]} | T], Exprs, Stabs) ->

lib/elixir/test/elixir/kernel/parser_test.exs

+51-1
Original file line numberDiff line numberDiff line change
@@ -474,6 +474,56 @@ defmodule Kernel.ParserTest do
474474
]}
475475
end
476476

477+
test "end of expression with literal" do
478+
file = """
479+
a do
480+
d ->
481+
(
482+
b -> c
483+
)
484+
end
485+
"""
486+
487+
assert Code.string_to_quoted!(file,
488+
token_metadata: true,
489+
literal_encoder: &{:ok, {:__block__, &2, [&1]}}
490+
) ==
491+
{:a,
492+
[
493+
end_of_expression: [newlines: 1, line: 6],
494+
do: [line: 1],
495+
end: [line: 6],
496+
line: 1
497+
],
498+
[
499+
[
500+
{{:__block__, [line: 1], [:do]},
501+
[
502+
{:->, [newlines: 1, line: 2],
503+
[
504+
[{:d, [line: 2], nil}],
505+
{:__block__,
506+
[
507+
end_of_expression: [newlines: 1, line: 5],
508+
newlines: 1,
509+
closing: [line: 5],
510+
line: 3
511+
],
512+
[
513+
[
514+
{:->, [line: 4],
515+
[
516+
[{:b, [line: 4], nil}],
517+
{:c, [end_of_expression: [newlines: 1, line: 4], line: 4], nil}
518+
]}
519+
]
520+
]}
521+
]}
522+
]}
523+
]
524+
]}
525+
end
526+
477527
test "does not add end of expression to ->" do
478528
file = """
479529
case true do
@@ -551,7 +601,7 @@ defmodule Kernel.ParserTest do
551601
[
552602
{:->, [line: 1],
553603
[
554-
[{:__block__, [token: "1", line: 1, closing: [line: 1], line: 1], [1]}],
604+
[{:__block__, [token: "1", line: 1], [1]}],
555605
{:__block__, [delimiter: "\"", line: 1], ["hello"]}
556606
]}
557607
]}

0 commit comments

Comments
 (0)