Skip to content

Commit dd13c50

Browse files
committed
Add mix test --breakpoints
1 parent b3710de commit dd13c50

File tree

5 files changed

+241
-90
lines changed

5 files changed

+241
-90
lines changed

lib/elixir/pages/getting-started/debugging.md

+21-15
Original file line numberDiff line numberDiff line change
@@ -79,7 +79,7 @@ feature #=> %{inspiration: "Rust", name: :dbg}
7979
Map.put(feature, :in_version, "1.14.0") #=> %{in_version: "1.14.0", inspiration: "Rust", name: :dbg}
8080
```
8181

82-
When talking about `IO.inspect/2`, we mentioned its usefulness when placed between steps of `|>` pipelines. `dbg` does it better: it understands Elixir code, so it will print values at *every step of the pipeline*.
82+
When talking about `IO.inspect/2`, we mentioned its usefulness when placed between steps of `|>` pipelines. `dbg` does it better: it understands Elixir code, so it will print values at _every step of the pipeline_.
8383

8484
```elixir
8585
# In dbg_pipes.exs
@@ -102,7 +102,7 @@ __ENV__.file #=> "/home/myuser/dbg_pipes.exs"
102102

103103
While `dbg` provides conveniences around Elixir constructs, you will need `IEx` if you want to execute code and set breakpoints while debugging.
104104

105-
## Breakpoints
105+
## Pry
106106

107107
When using `IEx`, you may pass `--dbg pry` as an option to "stop" the code execution where the `dbg` call is:
108108

@@ -116,22 +116,30 @@ Or to debug inside a of a project:
116116
$ iex --dbg pry -S mix
117117
```
118118

119-
Or during tests (the `--trace` flag on `mix test` prevents tests from timing out):
120-
121-
```console
122-
$ iex --dbg pry -S mix test --trace
123-
$ iex --dbg pry -S mix test path/to/file:line --trace
124-
```
119+
Now any call to `dbg` will ask if you want to pry the existing code. If you accept, you'll be able to access all variables, as well as imports and aliases from the code, directly from IEx. This is called "prying". While the pry session is running, the code execution stops, until `continue` (or `c`) or `next` (or `n`) are called. Remember you can always run `iex` in the context of a project with `iex -S mix TASK`.
125120

126-
Now a call to `dbg` will ask if you want to pry the existing code. If you accept, you'll be able to access all variables, as well as imports and aliases from the code, directly from IEx. This is called "prying". While the pry session is running, the code execution stops, until `continue` or `next` are called. Remember you can always run `iex` in the context of a project with `iex -S mix TASK`.
121+
<script id="asciicast-509509" src="https://asciinema.org/a/509509.js" async></script><noscript><p><a href="https://asciinema.org/a/509509">See the example in asciinema</a></p></noscript>
127122

128-
<script id="asciicast-509509" src="https://asciinema.org/a/509509.js" async></script>
123+
## Breakpoints
129124

130125
`dbg` calls require us to change the code we intend to debug and has limited stepping functionality. Luckily IEx also provides a `IEx.break!/2` function which allows you to set and manage breakpoints on any Elixir code without modifying its source:
131126

132127
<script type="text/javascript" src="https://asciinema.org/a/0h3po0AmTcBAorc5GBNU97nrs.js" id="asciicast-0h3po0AmTcBAorc5GBNU97nrs" async></script><noscript><p><a href="https://asciinema.org/a/0h3po0AmTcBAorc5GBNU97nrs">See the example in asciinema</a></p></noscript>
133128

134-
Similar to `dbg`, once a breakpoint is reached code execution stops until `continue` or `next` are invoked. However, `break!/2` does not have access to aliases and imports from the debugged code as it works on the compiled artifact rather than on source code.
129+
Similar to `dbg`, once a breakpoint is reached, code execution stops until `continue` (or `c`) or `next` (or `n`) are invoked. Breakpoints can navigate line-by-line by default, however, they do not have access to aliases and imports when breakpoints are set on compiled modules.
130+
131+
The `mix test` task direct integration with breakpoints via the `-b`/`--breakpoints` flag. When the flag is used, a breakpoint is set at the beginning of every test that will run:
132+
133+
<script async id="asciicast-XTZ15jFKFAlr8ZxIZMzaHgL5n" src="https://asciinema.org/a/XTZ15jFKFAlr8ZxIZMzaHgL5n.js"></script><noscript><p><a href="https://asciinema.org/a/XTZ15jFKFAlr8ZxIZMzaHgL5n">See the example in asciinema</a></p></noscript>
134+
135+
Here are some commands you can use in practice:
136+
137+
```console
138+
# Debug all failed tests
139+
$ iex -S mix test --breakpoints --failed
140+
# Debug the test at the given file:line
141+
$ iex -S mix test -b path/to/file:line
142+
```
135143

136144
## Observer
137145

@@ -147,15 +155,13 @@ iex> :observer.start()
147155
> When running `iex` inside a project with `iex -S mix`, `observer` won't be available as a dependency. To do so, you will need to call the following functions before:
148156
>
149157
> ```elixir
150-
> iex> Mix.ensure_application!(:wx)
151-
> iex> Mix.ensure_application!(:runtime_tools)
158+
> iex> Mix.ensure_application!(:wx) # Not necessary on Erlang/OTP 27+
159+
> iex> Mix.ensure_application!(:runtime_tools) # Not necessary on Erlang/OTP 27+
152160
> iex> Mix.ensure_application!(:observer)
153161
> iex> :observer.start()
154162
> ```
155163
>
156164
> If any of the calls above fail, here is what may have happened: some package managers default to installing a minimized Erlang without WX bindings for GUI support. In some package managers, you may be able to replace the headless Erlang with a more complete package (look for packages named `erlang` vs `erlang-nox` on Debian/Ubuntu/Arch). In others managers, you may need to install a separate `erlang-wx` (or similarly named) package.
157-
>
158-
> There are conversations to improve this experience in future releases.
159165
160166
The above will open another Graphical User Interface that provides many panes to fully understand and navigate the runtime and your project.
161167

lib/ex_unit/lib/ex_unit/case.ex

+32-14
Original file line numberDiff line numberDiff line change
@@ -366,34 +366,52 @@ defmodule ExUnit.Case do
366366
end
367367

368368
contents =
369-
case contents do
369+
case annotate_test(contents, __CALLER__) do
370370
[do: block] ->
371371
quote do
372372
unquote(block)
373373
:ok
374374
end
375375

376-
_ ->
376+
contents ->
377377
quote do
378378
try(unquote(contents))
379379
:ok
380380
end
381381
end
382382

383-
var = Macro.escape(var)
384-
contents = Macro.escape(contents, unquote: true)
385383
%{module: mod, file: file, line: line} = __CALLER__
386384

387-
quote bind_quoted: [
388-
var: var,
389-
contents: contents,
390-
message: message,
391-
mod: mod,
392-
file: file,
393-
line: line
394-
] do
395-
name = ExUnit.Case.register_test(mod, file, line, :test, message, [])
396-
def unquote(name)(unquote(var)), do: unquote(contents)
385+
name =
386+
quote do
387+
name =
388+
ExUnit.Case.register_test(
389+
unquote(mod),
390+
unquote(file),
391+
unquote(line),
392+
:test,
393+
unquote(message),
394+
[]
395+
)
396+
end
397+
398+
def =
399+
{:def, [],
400+
[
401+
{{:unquote, [], [quote(do: name)]}, [], [var]},
402+
[do: contents]
403+
]}
404+
405+
{:__block__, [], [name, def]}
406+
end
407+
408+
defp annotate_test(contents, caller) do
409+
if Application.get_env(:ex_unit, :breakpoints, false) and Keyword.keyword?(contents) do
410+
for {key, expr} <- contents do
411+
{key, IEx.Pry.annotate_quoted(expr, true, caller)}
412+
end
413+
else
414+
contents
397415
end
398416
end
399417

lib/iex/lib/iex/pry.ex

+93-51
Original file line numberDiff line numberDiff line change
@@ -86,7 +86,7 @@ defmodule IEx.Pry do
8686
end
8787

8888
@doc false
89-
def pry_with_next(next?, binding, opts_or_env) when is_boolean(next?) do
89+
def __next__(next?, binding, opts_or_env) when is_boolean(next?) do
9090
next? and pry(binding, opts_or_env) == {:ok, true}
9191
end
9292

@@ -108,6 +108,63 @@ defmodule IEx.Pry do
108108
[]
109109
end
110110

111+
@doc """
112+
Annotate quoted expression with line-by-line `IEx.Pry` debugging steps.
113+
114+
It expected the `quoted` expression to annotate, a `condition` that controls
115+
if pry should run or not (usually is simply the boolean `true`), and the
116+
caller macro environment.
117+
"""
118+
@doc since: "1.17.0"
119+
@spec annotate_quoted(Macro.t(), Macro.t(), Macro.Env.t()) :: Macro.t()
120+
def annotate_quoted(quoted, condition, caller) do
121+
prelude =
122+
quote do
123+
[
124+
env = unquote(Macro.escape(Macro.Env.prune_compile_info(caller))),
125+
next? = unquote(condition)
126+
]
127+
end
128+
129+
next_pry =
130+
fn line, _version, _binding ->
131+
quote do
132+
next? = IEx.Pry.__next__(next?, binding(), %{env | line: unquote(line)})
133+
end
134+
end
135+
136+
annotate_quoted(quoted, prelude, caller.line, 0, :ok, fn _, _ -> :ok end, next_pry)
137+
end
138+
139+
defp annotate_quoted(maybe_block, prelude, line, version, binding, next_binding, next_pry)
140+
when is_list(prelude) do
141+
exprs =
142+
maybe_block
143+
|> unwrap_block()
144+
|> annotate_quoted(true, line, version, binding, {next_binding, next_pry})
145+
146+
{:__block__, [], prelude ++ exprs}
147+
end
148+
149+
defp annotate_quoted([expr | exprs], force?, line, version, binding, funs) do
150+
{next_binding, next_pry} = funs
151+
new_binding = next_binding.(expr, binding)
152+
{min_line, max_line} = line_range(expr, line)
153+
154+
if force? or min_line > line do
155+
[
156+
next_pry.(min_line, version, binding),
157+
expr | annotate_quoted(exprs, false, max_line, version + 1, new_binding, funs)
158+
]
159+
else
160+
[expr | annotate_quoted(exprs, false, max_line, version, new_binding, funs)]
161+
end
162+
end
163+
164+
defp annotate_quoted([], _force?, _line, _version, _binding, _funs) do
165+
[]
166+
end
167+
111168
@doc """
112169
Formats the location for `whereami/3` prying.
113170
@@ -473,7 +530,6 @@ defmodule IEx.Pry do
473530

474531
defp instrument_clause({meta, args, guards, clause}, ref, case_pattern, opts) do
475532
arity = length(args)
476-
exprs = unwrap_block(clause)
477533

478534
# Have an extra binding per argument for case matching.
479535
case_vars =
@@ -487,63 +543,49 @@ defmodule IEx.Pry do
487543
# Generate the take_over condition with the ETS lookup.
488544
# Remember this is expanded AST, so no aliases allowed,
489545
# no locals (such as the unary -) and so on.
490-
initialize_next =
546+
prelude =
491547
quote do
492-
unquote(next_var(arity + 1)) =
493-
case unquote(case_head) do
494-
unquote(case_pattern) ->
495-
:erlang."/="(
496-
# :ets.update_counter(table, key, {pos, inc, threshold, reset})
497-
:ets.update_counter(unquote(@table), unquote(ref), unquote(update_op)),
498-
unquote(-1)
499-
)
500-
501-
_ ->
502-
false
503-
end
548+
[
549+
unquote(next_var(arity + 1)) = unquote(opts),
550+
unquote(next_var(arity + 2)) =
551+
case unquote(case_head) do
552+
unquote(case_pattern) ->
553+
:erlang."/="(
554+
# :ets.update_counter(table, key, {pos, inc, threshold, reset})
555+
:ets.update_counter(unquote(@table), unquote(ref), unquote(update_op)),
556+
unquote(-1)
557+
)
558+
559+
_ ->
560+
false
561+
end
562+
]
504563
end
505564

506565
args =
507566
case_vars
508567
|> Enum.zip(args)
509568
|> Enum.map(fn {var, arg} -> {:=, [], [arg, var]} end)
510569

511-
# The variable we pass around will start after the arity,
512-
# as we use the arity to instrument the clause.
570+
version = arity + 2
513571
binding = match_binding(args, %{})
514572
line = Keyword.get(meta, :line, 1)
515-
exprs = instrument_body(exprs, true, line, arity + 1, binding, opts)
516-
517-
{meta, args, guards, {:__block__, meta, [initialize_next | exprs]}}
518-
end
519-
520-
defp instrument_body([expr | exprs], force?, line, version, binding, opts) do
521-
next_binding = binding(expr, binding)
522-
{min_line, max_line} = line_range(expr, line)
523-
524-
if force? or min_line > line do
525-
pry_var = next_var(version)
526-
pry_binding = Map.to_list(binding)
527-
pry_opts = [line: min_line] ++ opts
528-
529-
pry =
530-
quote do
531-
unquote(next_var(version + 1)) =
532-
:"Elixir.IEx.Pry".pry_with_next(
533-
unquote(pry_var),
534-
unquote(pry_binding),
535-
unquote(pry_opts)
536-
)
537-
end
538-
539-
[pry, expr | instrument_body(exprs, false, max_line, version + 1, next_binding, opts)]
540-
else
541-
[expr | instrument_body(exprs, false, max_line, version, next_binding, opts)]
542-
end
543-
end
573+
env_var = next_var(arity + 1)
574+
575+
clause =
576+
annotate_quoted(clause, prelude, line, version, binding, &next_binding/2, fn
577+
line, version, binding ->
578+
quote do
579+
unquote(next_var(version + 1)) =
580+
:"Elixir.IEx.Pry".__next__(
581+
unquote(next_var(version)),
582+
unquote(Map.to_list(binding)),
583+
[{:line, unquote(line)} | unquote(env_var)]
584+
)
585+
end
586+
end)
544587

545-
defp instrument_body([], _force?, _line, _version, _binding, _opts) do
546-
[]
588+
{meta, args, guards, clause}
547589
end
548590

549591
defp line_range(ast, line) do
@@ -567,7 +609,7 @@ defmodule IEx.Pry do
567609
if min == :infinity, do: {line, max}, else: {min, max}
568610
end
569611

570-
defp binding(ast, binding) do
612+
defp next_binding(ast, binding) do
571613
{_, binding} =
572614
Macro.prewalk(ast, binding, fn
573615
{:=, _, [left, _right]}, acc ->
@@ -637,7 +679,7 @@ defmodule IEx.Pry do
637679

638680
env = unquote(env_with_line_from_asts(first_ast_chunk))
639681

640-
next? = IEx.Pry.pry_with_next(true, binding(), env)
682+
next? = IEx.Pry.__next__(true, binding(), env)
641683
value = unquote(pipe_chunk_of_asts(first_ast_chunk))
642684

643685
IEx.Pry.__dbg_pipe_step__(
@@ -656,7 +698,7 @@ defmodule IEx.Pry do
656698
quote do
657699
unquote(ast_acc)
658700
env = unquote(env_with_line_from_asts(asts_chunk))
659-
next? = IEx.Pry.pry_with_next(next?, binding(), env)
701+
next? = IEx.Pry.__next__(next?, binding(), env)
660702
value = unquote(piped_asts)
661703

662704
IEx.Pry.__dbg_pipe_step__(

0 commit comments

Comments
 (0)