Skip to content

Commit 9dcdc1a

Browse files
authored
Add get_in/1 with safe nil-handling for access and structs (#13370)
1 parent a52d201 commit 9dcdc1a

File tree

4 files changed

+139
-63
lines changed

4 files changed

+139
-63
lines changed

lib/elixir/lib/access.ex

+46-33
Original file line numberDiff line numberDiff line change
@@ -35,61 +35,74 @@ defmodule Access do
3535
iex> nil[:a]
3636
nil
3737
38-
The access syntax can also be used with the `Kernel.put_in/2`,
39-
`Kernel.update_in/2` and `Kernel.get_and_update_in/2` macros
40-
to allow values to be set in nested data structures:
41-
42-
iex> users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
43-
iex> put_in(users["john"][:age], 28)
44-
%{"john" => %{age: 28}, "meg" => %{age: 23}}
45-
4638
## Maps and structs
4739
4840
While the access syntax is allowed in maps via `map[key]`,
4941
if your map is made of predefined atom keys, you should prefer
5042
to access those atom keys with `map.key` instead of `map[key]`,
5143
as `map.key` will raise if the key is missing (which is not
52-
supposed to happen if the keys are predefined).
44+
supposed to happen if the keys are predefined) or if `map` is
45+
`nil`.
5346
5447
Similarly, since structs are maps and structs have predefined
5548
keys, they only allow the `struct.key` syntax and they do not
56-
allow the `struct[key]` access syntax. `Access.key/1` can also
57-
be used to construct dynamic access to structs and maps.
49+
allow the `struct[key]` access syntax.
5850
59-
In a nutshell, when using `put_in/2` and friends:
51+
In other words, the `map[key]` syntax is loose, returning `nil`
52+
for missing keys, while the `map.key` syntax is strict, raising
53+
for both nil values and missing keys.
6054
61-
put_in(struct_or_map.key, :value)
62-
put_in(keyword_or_map[:key], :value)
55+
To bridge this gap, Elixir provides the `get_in/1` and `get_in/2`
56+
functions, which are capable of traversing nested data structures,
57+
even in the presence of `nil`s:
6358
64-
When using `put_in/3` and friends:
59+
iex> users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
60+
iex> get_in(users["john"].age)
61+
27
62+
iex> get_in(users["unknown"].age)
63+
nil
6564
66-
put_in(struct_or_map, [Access.key!(:key)], :value)
67-
put_in(keyword_or_map, [:key], :value)
65+
Notice how, even if no user was found, `get_in/1` returned `nil`.
66+
Outside of `get_in/1`, trying to access the field `.age` on `nil`
67+
would raise.
6868
69-
This covers the dual nature of maps in Elixir, as they can be
70-
either for structured data or as a key-value store. See the `Map`
71-
module for more information.
69+
The `get_in/2` function takes one step further by allowing
70+
different accessors to be mixed in. For example, given a user
71+
map with the `:name` and `:languages` keys, here is how to
72+
access the name of all programming languages:
7273
73-
## Nested data structures
74+
iex> languages = [
75+
...> %{name: "elixir", type: :functional},
76+
...> %{name: "c", type: :procedural}
77+
...> ]
78+
iex> user = %{name: "john", languages: languages}
79+
iex> get_in(user, [:languages, Access.all(), :name])
80+
["elixir", "c"]
7481
75-
Both key-based access syntaxes can be used with the nested update
76-
functions and macros in `Kernel`, such as `Kernel.get_in/2`,
77-
`Kernel.put_in/3`, `Kernel.update_in/3`, `Kernel.pop_in/2`, and
78-
`Kernel.get_and_update_in/3`.
82+
This module provides convenience functions for traversing other
83+
structures, like tuples and lists. As we will see next, they can
84+
even be used to update nested data structures.
85+
86+
If you want to learn more about the dual nature of maps in Elixir,
87+
as they can be either for structured data or as a key-value store,
88+
see the `Map` module.
7989
80-
For example, to update a map inside another map:
90+
## Updating nested data structures
91+
92+
The access syntax can also be used with the `Kernel.put_in/2`,
93+
`Kernel.update_in/2`, `Kernel.get_and_update_in/2`, and `Kernel.pop_in/1`
94+
macros to further manipulate values in nested data structures:
8195
8296
iex> users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
8397
iex> put_in(users["john"].age, 28)
8498
%{"john" => %{age: 28}, "meg" => %{age: 23}}
8599
86-
This module provides convenience functions for traversing other
87-
structures, like tuples and lists. These functions can be used
88-
in all the `Access`-related functions and macros in `Kernel`.
89-
90-
For instance, given a user map with the `:name` and `:languages`
91-
keys, here is how to deeply traverse the map and convert all
92-
language names to uppercase:
100+
As shown in the previous section, you can also use the
101+
`Kernel.put_in/3`, `Kernel.update_in/3`, `Kernel.pop_in/2`, and
102+
`Kernel.get_and_update_in/3` functions to provide nested
103+
custom accessors. For instance, given a user map with the
104+
`:name` and `:languages` keys, here is how to deeply traverse
105+
the map and convert all language names to uppercase:
93106
94107
iex> languages = [
95108
...> %{name: "elixir", type: :functional},

lib/elixir/lib/kernel.ex

+75-28
Original file line numberDiff line numberDiff line change
@@ -2680,16 +2680,12 @@ defmodule Kernel do
26802680
end
26812681

26822682
@doc """
2683-
Gets a value from a nested structure.
2683+
Gets a value from a nested structure with nil-safe handling.
26842684
26852685
Uses the `Access` module to traverse the structures
26862686
according to the given `keys`, unless the `key` is a
26872687
function, which is detailed in a later section.
26882688
2689-
Note that if none of the given keys are functions,
2690-
there is rarely a reason to use `get_in` over
2691-
writing "regular" Elixir code using `[]`.
2692-
26932689
## Examples
26942690
26952691
iex> users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
@@ -2717,18 +2713,6 @@ defmodule Kernel do
27172713
iex> users["unknown"][:age]
27182714
nil
27192715
2720-
iex> users = nil
2721-
iex> get_in(users, [Access.all(), :age])
2722-
nil
2723-
2724-
Alternatively, if you need to access complex data-structures, you can
2725-
use pattern matching:
2726-
2727-
case users do
2728-
%{"john" => %{age: age}} -> age
2729-
_ -> default_value
2730-
end
2731-
27322716
## Functions as keys
27332717
27342718
If a key given to `get_in/2` is a function, the function will be invoked
@@ -2758,13 +2742,19 @@ defmodule Kernel do
27582742
27592743
get_in(some_struct, [:some_key, :nested_key])
27602744
2761-
The good news is that structs have predefined shape. Therefore,
2762-
you can write instead:
2745+
There are two alternatives. Given structs have predefined keys,
2746+
we can use the `struct.field` notation:
27632747
27642748
some_struct.some_key.nested_key
27652749
2766-
If, by any chance, `some_key` can return nil, you can always
2767-
fallback to pattern matching to provide nested struct handling:
2750+
However, the code above will fail if any of the values return `nil`.
2751+
If you also want to handle nil values, you can use `get_in/1`:
2752+
2753+
get_in(some_struct.some_key.nested_key)
2754+
2755+
Pattern-matching is another option for handling such cases,
2756+
which can be especially useful if you want to match on several
2757+
fields at once or provide custom return values:
27682758
27692759
case some_struct do
27702760
%{some_key: %{nested_key: value}} -> value
@@ -2982,6 +2972,63 @@ defmodule Kernel do
29822972
defp pop_in_data(data, [key | tail]),
29832973
do: Access.get_and_update(data, key, &pop_in_data(&1, tail))
29842974

2975+
@doc """
2976+
Gets a key from the nested structure via the given `path`, with
2977+
nil-safe handling.
2978+
2979+
This is similar to `get_in/2`, except the path is extracted via
2980+
a macro rather than passing a list. For example:
2981+
2982+
get_in(opts[:foo][:bar])
2983+
2984+
Is equivalent to:
2985+
2986+
get_in(opts, [:foo, :bar])
2987+
2988+
Additionally, this macro can traverse structs:
2989+
2990+
get_in(struct.foo.bar)
2991+
2992+
In case any of the keys returns `nil`, then `nil` will be returned
2993+
and `get_in/1` won't traverse any further.
2994+
2995+
Note that in order for this macro to work, the complete path must always
2996+
be visible by this macro. For more information about the supported path
2997+
expressions, please check `get_and_update_in/2` docs.
2998+
2999+
## Examples
3000+
3001+
iex> users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
3002+
iex> get_in(users["john"].age)
3003+
27
3004+
iex> get_in(users["unknown"].age)
3005+
nil
3006+
3007+
"""
3008+
defmacro get_in(path) do
3009+
{[h | t], _} = unnest(path, [], true, "get_in/1")
3010+
nest_get_in(h, quote(do: x), t)
3011+
end
3012+
3013+
defp nest_get_in(h, _var, []) do
3014+
h
3015+
end
3016+
3017+
defp nest_get_in(h, var, [{:map, key} | tail]) do
3018+
quote generated: true do
3019+
case unquote(h) do
3020+
%{unquote(key) => unquote(var)} -> unquote(nest_get_in(var, var, tail))
3021+
nil -> nil
3022+
unquote(var) -> :erlang.error({:badkey, unquote(key), unquote(var)})
3023+
end
3024+
end
3025+
end
3026+
3027+
defp nest_get_in(h, var, [{:access, key} | tail]) do
3028+
h = quote do: Access.get(unquote(h), unquote(key))
3029+
nest_get_in(h, var, tail)
3030+
end
3031+
29853032
@doc """
29863033
Puts a value in a nested structure via the given `path`.
29873034
@@ -3017,7 +3064,7 @@ defmodule Kernel do
30173064
defmacro put_in(path, value) do
30183065
case unnest(path, [], true, "put_in/2") do
30193066
{[h | t], true} ->
3020-
nest_update_in(h, t, quote(do: fn _ -> unquote(value) end))
3067+
nest_map_update_in(h, t, quote(do: fn _ -> unquote(value) end))
30213068

30223069
{[h | t], false} ->
30233070
expr = nest_get_and_update_in(h, t, quote(do: fn _ -> {nil, unquote(value)} end))
@@ -3094,7 +3141,7 @@ defmodule Kernel do
30943141
defmacro update_in(path, fun) do
30953142
case unnest(path, [], true, "update_in/2") do
30963143
{[h | t], true} ->
3097-
nest_update_in(h, t, fun)
3144+
nest_map_update_in(h, t, fun)
30983145

30993146
{[h | t], false} ->
31003147
expr = nest_get_and_update_in(h, t, quote(do: fn x -> {nil, unquote(fun).(x)} end))
@@ -3160,17 +3207,17 @@ defmodule Kernel do
31603207
nest_get_and_update_in(h, t, fun)
31613208
end
31623209

3163-
defp nest_update_in([], fun), do: fun
3210+
defp nest_map_update_in([], fun), do: fun
31643211

3165-
defp nest_update_in(list, fun) do
3212+
defp nest_map_update_in(list, fun) do
31663213
quote do
3167-
fn x -> unquote(nest_update_in(quote(do: x), list, fun)) end
3214+
fn x -> unquote(nest_map_update_in(quote(do: x), list, fun)) end
31683215
end
31693216
end
31703217

3171-
defp nest_update_in(h, [{:map, key} | t], fun) do
3218+
defp nest_map_update_in(h, [{:map, key} | t], fun) do
31723219
quote do
3173-
Map.update!(unquote(h), unquote(key), unquote(nest_update_in(t, fun)))
3220+
Map.update!(unquote(h), unquote(key), unquote(nest_map_update_in(t, fun)))
31743221
end
31753222
end
31763223

lib/elixir/pages/getting-started/keywords-and-maps.md

+2-2
Original file line numberDiff line numberDiff line change
@@ -217,7 +217,7 @@ Elixir developers typically prefer to use the `map.key` syntax and pattern match
217217

218218
## Nested data structures
219219

220-
Often we will have maps inside maps, or even keywords lists inside maps, and so forth. Elixir provides conveniences for manipulating nested data structures via the `put_in/2`, `update_in/2` and other macros giving the same conveniences you would find in imperative languages while keeping the immutable properties of the language.
220+
Often we will have maps inside maps, or even keywords lists inside maps, and so forth. Elixir provides conveniences for manipulating nested data structures via the `get_in/1`, `put_in/2`, `update_in/2`, and other macros giving the same conveniences you would find in imperative languages while keeping the immutable properties of the language.
221221

222222
Imagine you have the following structure:
223223

@@ -259,7 +259,7 @@ iex> users = update_in users[:mary].languages, fn languages -> List.delete(langu
259259
]
260260
```
261261

262-
There is more to learn about `put_in/2` and `update_in/2`, including the `get_and_update_in/2` that allows us to extract a value and update the data structure at once. There are also `put_in/3`, `update_in/3` and `get_and_update_in/3` which allow dynamic access into the data structure.
262+
There is more to learn about `get_in/1`, `pop_in/1` and others, including the `get_and_update_in/2` that allows us to extract a value and update the data structure at once. There are also `get_in/3`, `put_in/3`, `update_in/3`, `get_and_update_in/3`, `pop_in/2` which allow dynamic access into the data structure.
263263

264264
## Summary
265265

lib/elixir/test/elixir/kernel_test.exs

+16
Original file line numberDiff line numberDiff line change
@@ -929,6 +929,22 @@ defmodule KernelTest do
929929
defstruct [:foo, :bar]
930930
end
931931

932+
test "get_in/1" do
933+
users = %{"john" => %{age: 27}, :meg => %{age: 23}}
934+
assert get_in(users["john"][:age]) == 27
935+
assert get_in(users["dave"][:age]) == nil
936+
assert get_in(users["john"].age) == 27
937+
assert get_in(users["dave"].age) == nil
938+
assert get_in(users.meg[:age]) == 23
939+
assert get_in(users.meg.age) == 23
940+
941+
is_nil = nil
942+
assert get_in(is_nil.age) == nil
943+
944+
assert_raise KeyError, ~r"key :unknown not found", fn -> get_in(users.unknown) end
945+
assert_raise KeyError, ~r"key :unknown not found", fn -> get_in(users.meg.unknown) end
946+
end
947+
932948
test "get_in/2" do
933949
users = %{"john" => %{age: 27}, "meg" => %{age: 23}}
934950
assert get_in(users, ["john", :age]) == 27

0 commit comments

Comments
 (0)