Skip to content

Commit 833546b

Browse files
authored
Merge branch 'main' into fix-91
2 parents a2e509b + e510182 commit 833546b

File tree

33 files changed

+66
-66
lines changed

33 files changed

+66
-66
lines changed

README.md

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -50,7 +50,7 @@ Thank you to our corporate sponsors! If you'd like to start sponsoring the proje
5050

5151
### Corporate
5252

53-
For companies wanting to directly sponsor full time work on Expert, please reach out to Dan Janowski: EEF Chair of Sponsorship WG at danj@erlef.org.
53+
For companies wanting to directly sponsor full time work on Expert, please reach out to Dan Janowski: EEF Chair of Sponsorship WG at sponsor+expert (at) erlef (dot) org.
5454

5555
### Individual
5656

apps/engine/lib/engine/analyzer.ex

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -205,7 +205,7 @@ defmodule Engine.Analyzer do
205205
# Trailing aliases happen when you use the curly syntax to define multiple aliases
206206
# in one go, like Foo.{First, Second.Third, Fourth}
207207
# Our alias mapping will have Third mapped to Foo.Second.Third, so we need to look
208-
# for Third, wheras the leading alias will look for Second in the mappings.
208+
# for Third, whereas the leading alias will look for Second in the mappings.
209209
with {:ok, resolved} <- Map.fetch(aliases_mapping, List.last(segments)) do
210210
{:ok, List.wrap(resolved)}
211211
end

apps/engine/lib/engine/api/proxy.ex

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -23,8 +23,8 @@ defmodule Engine.Api.Proxy do
2323
2424
Internally, there are three states: proxying, draining and buffering.
2525
The proxy starts in proxying mode. Then, when start_buffering is called, it changes to draining mode. This
26-
mode checks if there are any in-flight calls. If there aren't any, it changes immediately to buffring mode.
27-
If there are in-flight reqeusts, it waits for them to finish, and then switches to buffer mode. Once in buffer
26+
mode checks if there are any in-flight calls. If there aren't any, it changes immediately to buffering mode.
27+
If there are in-flight requests, it waits for them to finish, and then switches to buffer mode. Once in buffer
2828
mode, requests are buffered until the process that called `start_buffering` exits. When that happens, then
2929
the requests are de-duplicated and run, and then the proxy returns to proxying mode.
3030

apps/engine/lib/engine/bootstrap.ex

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -75,7 +75,7 @@ defmodule Engine.Bootstrap do
7575

7676
# Note about the following code:
7777
# I tried a bunch of stuff to get it to work, like checking if the
78-
# app is an umbrella (umbrealla? returns false when started in a subapp)
78+
# app is an umbrella (umbrella? returns false when started in a subapp)
7979
# to no avail. This was the only thing that consistently worked
8080
{:ok, configured_root} =
8181
Engine.Mix.in_project(project, fn _ ->

apps/engine/lib/engine/build/project.ex

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -104,7 +104,7 @@ defmodule Engine.Build.Project do
104104

105105
defp connected_to_internet? do
106106
# While there's no perfect way to check if a computer is connected to the internet,
107-
# it seems reasonable to gate pulling dependenices on a resolution check for hex.pm.
107+
# it seems reasonable to gate pulling dependencies on a resolution check for hex.pm.
108108
# Yes, it's entirely possible that the DNS server is local, and that the entry is in cache,
109109
# but that's an edge case, and the build will just time out anyways.
110110
case :inet_res.getbyname(~c"hex.pm", :a, 250) do

apps/engine/lib/engine/search/fuzzy/scorer.ex

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -230,7 +230,7 @@ defmodule Engine.Search.Fuzzy.Scorer do
230230
{streak_length, @consecutive_character_bonus * streak_length}
231231
end
232232

233-
@mismatched_chracter_penalty 5
233+
@mismatched_character_penalty 5
234234

235235
def mismatched_penalty(matched_positions) do
236236
{penalty, _} =
@@ -244,7 +244,7 @@ defmodule Engine.Search.Fuzzy.Scorer do
244244
matched_position, {penalty, last_match} ->
245245
distance = matched_position - last_match
246246

247-
{penalty + distance * @mismatched_chracter_penalty, matched_position}
247+
{penalty + distance * @mismatched_character_penalty, matched_position}
248248
end)
249249

250250
penalty

apps/engine/lib/engine/search/indexer.ex

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -101,7 +101,7 @@ defmodule Engine.Search.Indexer do
101101
total_bytes = paths_to_sizes |> Enum.map(&elem(&1, 1)) |> Enum.sum()
102102

103103
if total_bytes > 0 do
104-
{on_update_progess, on_complete} =
104+
{on_update_progress, on_complete} =
105105
Progress.begin_percent("Indexing source code", total_bytes)
106106

107107
initial_state = {0, []}
@@ -131,7 +131,7 @@ defmodule Engine.Search.Indexer do
131131
fn chunk ->
132132
block_bytes = chunk |> Enum.map(&Map.get(path_to_size_map, &1)) |> Enum.sum()
133133
result = Enum.map(chunk, processor)
134-
on_update_progess.(block_bytes, "Indexing")
134+
on_update_progress.(block_bytes, "Indexing")
135135
result
136136
end,
137137
timeout: timeout

apps/engine/lib/engine/search/indexer/extractors/module.ex

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -278,14 +278,14 @@ defmodule Engine.Search.Indexer.Extractors.Module do
278278

279279
defp module(_, _), do: :error
280280

281-
@protocol_module_attribue_names [:protocol, :for]
281+
@protocol_module_attribute_names [:protocol, :for]
282282

283283
@starts_with_capital ~r/[A-Z]+/
284284
defp module_part?(part) when is_atom(part) do
285285
Regex.match?(@starts_with_capital, Atom.to_string(part))
286286
end
287287

288-
defp module_part?({:@, _, [{type, _, _} | _]}) when type in @protocol_module_attribue_names,
288+
defp module_part?({:@, _, [{type, _, _} | _]}) when type in @protocol_module_attribute_names,
289289
do: true
290290

291291
defp module_part?({:__MODULE__, _, context}) when is_atom(context), do: true
@@ -306,7 +306,7 @@ defmodule Engine.Search.Indexer.Extractors.Module do
306306

307307
# handles @protocol and @for in defimpl blocks
308308
defp to_range(%Reducer{} = reducer, [{:@, _, [{type, _, _} | _]} = attribute | segments], _)
309-
when type in @protocol_module_attribue_names do
309+
when type in @protocol_module_attribute_names do
310310
range = Sourceror.get_range(attribute)
311311

312312
document = reducer.analysis.document

apps/engine/lib/engine/search/store/backends/ets/wal.ex

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -84,8 +84,8 @@ defmodule Engine.Search.Store.Backends.Ets.Wal do
8484
exists?(wal.project, wal.schema_version)
8585
end
8686

87-
def exists?(%Project{} = project, schema_vesion) do
88-
case File.ls(wal_directory(project, schema_vesion)) do
87+
def exists?(%Project{} = project, schema_version) do
88+
case File.ls(wal_directory(project, schema_version)) do
8989
{:ok, [_]} -> true
9090
{:ok, [_ | _]} -> true
9191
_ -> false

apps/engine/test/engine/analyzer/imports_test.exs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -98,7 +98,7 @@ defmodule Engine.Ast.Analysis.ImportsTest do
9898
assert_imported(imports, ImportedModule)
9999
end
100100

101-
test "single underscore functions aren't imported by defualt" do
101+
test "single underscore functions aren't imported by default" do
102102
imports =
103103
~q[
104104
import Parent.Child.ImportedModule

0 commit comments

Comments
 (0)