Skip to content
Merged
Show file tree
Hide file tree
Changes from 3 commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
2 changes: 1 addition & 1 deletion lib/elixir/lib/module/types/descr.ex
Original file line number Diff line number Diff line change
Expand Up @@ -3472,7 +3472,7 @@ defmodule Module.Types.Descr do
empty_s1_diff = empty?(s1_diff)

cond do
# if fst is a subtype of s1, the disjointness invariant ensures we can
# if fst is a subtype of s1, the disjointedness invariant ensures we can
# add those two pairs and end the recursion
empty_fst_diff and empty_s1_diff ->
[{x, union(snd, s2)} | pairs ++ acc]
Expand Down
2 changes: 1 addition & 1 deletion lib/elixir/lib/module/types/helpers.ex
Original file line number Diff line number Diff line change
Expand Up @@ -165,7 +165,7 @@ defmodule Module.Types.Helpers do
defp collect_var_traces(parent_expr, traces) do
traces
|> Enum.reject(fn {expr, _file, type} ->
# As an otimization do not care about dynamic terms
# As an optimization do not care about dynamic terms
type == %{dynamic: :term} or expr == parent_expr
end)
|> case do
Expand Down
6 changes: 4 additions & 2 deletions lib/elixir/lib/protocol.ex
Original file line number Diff line number Diff line change
Expand Up @@ -280,9 +280,11 @@ defmodule Protocol do
type_args = :lists.map(fn _ -> quote(do: term) end, :lists.seq(2, arity))
type_args = [quote(do: t) | type_args]

varify = fn pos -> Macro.var(String.to_atom("arg" <> Integer.to_string(pos)), __MODULE__) end
convert_variables = fn pos ->
Macro.var(String.to_atom("arg" <> Integer.to_string(pos)), __MODULE__)
end

call_args = :lists.map(varify, :lists.seq(2, arity))
call_args = :lists.map(convert_variables, :lists.seq(2, arity))
call_args = [quote(do: term) | call_args]

quote generated: true do
Expand Down
2 changes: 1 addition & 1 deletion lib/elixir/lib/regex.ex
Original file line number Diff line number Diff line change
Expand Up @@ -947,7 +947,7 @@ defmodule Regex do
defp embeddable_modifiers([], acc, []), do: {:ok, acc}
defp embeddable_modifiers([], acc, err), do: {:error, acc, err}

# translate modifers to options
# translate modifiers to options

defp translate_options(<<?s, t::binary>>, acc),
do: translate_options(t, [:dotall, {:newline, :anycrlf} | acc])
Expand Down
Loading