File otp_src_27.2-doc-the-the.patch of Package erlang

diff -Ndurp otp_src_27.2/erts/doc/references/erl_driver.md otp_src_27.2-doc-the-the/erts/doc/references/erl_driver.md
--- otp_src_27.2/erts/doc/references/erl_driver.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/erts/doc/references/erl_driver.md	2024-12-12 14:46:53.793467951 +0200
@@ -1830,7 +1830,7 @@ int erl_drv_consume_timeslice(ErlDrvPort
 ```
 
 Gives the runtime system a hint about how much CPU time the current driver
-callback call has consumed since the last hint, or since the the start of the
+callback call has consumed since the last hint, or since the start of the
 callback if no previous hint has been given.
 
 - **`port`** - Port handle of the executing port.
diff -Ndurp otp_src_27.2/erts/emulator/beam/jit/x86/instr_bs.cpp otp_src_27.2-doc-the-the/erts/emulator/beam/jit/x86/instr_bs.cpp
--- otp_src_27.2/erts/emulator/beam/jit/x86/instr_bs.cpp	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/erts/emulator/beam/jit/x86/instr_bs.cpp	2024-12-12 14:46:53.793467951 +0200
@@ -1344,7 +1344,7 @@ void BeamModuleAssembler::emit_bs_get_ut
     a.mov(RET, bin_position);
     a.shr(RET, 3);
 
-    /* The most significant bits come first, so we'll read the the next four
+    /* The most significant bits come first, so we'll read the next four
      * bytes as big-endian so we won't have to reorder them later. */
     if (hasCpuFeature(CpuFeatures::X86::kMOVBE)) {
         a.movbe(RETd, x86::dword_ptr(bin_base, RET));
diff -Ndurp otp_src_27.2/erts/emulator/test/bs_utf_SUITE.erl otp_src_27.2-doc-the-the/erts/emulator/test/bs_utf_SUITE.erl
--- otp_src_27.2/erts/emulator/test/bs_utf_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/erts/emulator/test/bs_utf_SUITE.erl	2024-12-12 14:46:53.793467951 +0200
@@ -89,7 +89,7 @@ do_utf8_roundtrip(First, Last) when Firs
     <<First/utf8>> = make_unaligned(Bin),
 
     %% Matching of utf8 segments use different code paths dependending
-    %% on the the number of bytes available in the binary. Make sure
+    %% on the number of bytes available in the binary. Make sure
     %% we test both code paths.
     <<First/utf8,0:64>> = id(<<Bin/binary,0:64>>),
     <<0:3,First/utf8,0:64>> = id(<<0:3,Bin/binary,0:64>>),
diff -Ndurp otp_src_27.2/erts/emulator/test/time_SUITE.erl otp_src_27.2-doc-the-the/erts/emulator/test/time_SUITE.erl
--- otp_src_27.2/erts/emulator/test/time_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/erts/emulator/test/time_SUITE.erl	2024-12-12 14:46:53.793467951 +0200
@@ -227,7 +227,7 @@ test_seconds_to_univ([]) ->
     ok.
 
 
-%% Test that the the different time functions return
+%% Test that the different time functions return
 %% consistent results.
 consistency(_Config) ->
     %% Test that:
diff -Ndurp otp_src_27.2/erts/preloaded/src/erlang.erl otp_src_27.2-doc-the-the/erts/preloaded/src/erlang.erl
--- otp_src_27.2/erts/preloaded/src/erlang.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/erts/preloaded/src/erlang.erl	2024-12-12 14:46:53.793467951 +0200
@@ -3229,7 +3229,7 @@ Halt the runtime system.
   - **`{flush_timeout, Timeout :: 0..2147483647 | infinity}`{: #halt_flush_timeout }** -
     Sets a limit on the time allowed for [flushing](#halt_flush) prior to
     termination of the runtime system. `Timeout` is in milliseconds. The default
-    value is determined by the the `erl` [`+zhft <Timeout>`](erl_cmd.md#+zhft)
+    value is determined by the `erl` [`+zhft <Timeout>`](erl_cmd.md#+zhft)
     command line flag.
 
     If flushing has been ongoing for `Timeout` milliseconds, flushing operations
diff -Ndurp otp_src_27.2/lib/common_test/src/ct_property_test.erl otp_src_27.2-doc-the-the/lib/common_test/src/ct_property_test.erl
--- otp_src_27.2/lib/common_test/src/ct_property_test.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/common_test/src/ct_property_test.erl	2024-12-12 14:46:53.793467951 +0200
@@ -60,7 +60,7 @@ prop_ftp_case(Config) ->
      ).
 ```
 
-and the the property test module (in this example
+and the property test module (in this example
 `ftp_simple_client_server.erl`) as almost a usual property testing module (More
 examples are in [the User's Guide](ct_property_test_chapter.md)):
 
diff -Ndurp otp_src_27.2/lib/compiler/doc/notes.md otp_src_27.2-doc-the-the/lib/compiler/doc/notes.md
--- otp_src_27.2/lib/compiler/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/compiler/doc/notes.md	2024-12-12 14:46:53.797467857 +0200
@@ -3570,7 +3570,7 @@ This document describes the changes made
 
   Own Id: OTP-7679
 
-- Code that (incorrectly) used the the value of nested applications of
+- Code that (incorrectly) used the value of nested applications of
   [`setelement/3`](`setelement/3`) in bit syntax construction could crash the
   compiler.
 
diff -Ndurp otp_src_27.2/lib/compiler/src/beam_ssa_type.erl otp_src_27.2-doc-the-the/lib/compiler/src/beam_ssa_type.erl
--- otp_src_27.2/lib/compiler/src/beam_ssa_type.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/compiler/src/beam_ssa_type.erl	2024-12-12 14:46:53.797467857 +0200
@@ -2595,7 +2595,7 @@ infer_relop('=/=', [LHS,RHS], [LType,RTy
     %% For example, if we have L =/= [a], we must not subtract 'cons'
     %% from the type of L. In general, subtraction is only safe if
     %% the type being subtracted is singled-valued, for example if it
-    %% is [] or the the atom 'true'.
+    %% is [] or the atom 'true'.
     %%
     %% Note that we subtract the left-hand type from the right-hand
     %% value and vice versa. We must not subtract the meet of the two
diff -Ndurp otp_src_27.2/lib/compiler/src/sys_core_fold.erl otp_src_27.2-doc-the-the/lib/compiler/src/sys_core_fold.erl
--- otp_src_27.2/lib/compiler/src/sys_core_fold.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/compiler/src/sys_core_fold.erl	2024-12-12 14:46:53.797467857 +0200
@@ -2234,7 +2234,7 @@ opt_build_stacktrace(#c_let{vars=[#c_var
                     %% The stacktrace is only used in the last
                     %% argument for erlang:raise/3. There is no need
                     %% to build the stacktrace. Replace the call to
-                    %% erlang:raise/3 with the the raw_raise/3
+                    %% erlang:raise/3 with the raw_raise/3
                     %% instruction, which will use a raw stacktrace.
                     #c_primop{name=#c_literal{val=raw_raise},
                               args=[Class,Exp,RawStk]}
diff -Ndurp otp_src_27.2/lib/compiler/test/compile_SUITE_data/ssh.hrl otp_src_27.2-doc-the-the/lib/compiler/test/compile_SUITE_data/ssh.hrl
--- otp_src_27.2/lib/compiler/test/compile_SUITE_data/ssh.hrl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/compiler/test/compile_SUITE_data/ssh.hrl	2024-12-12 14:50:17.436558107 +0200
@@ -365,7 +365,7 @@ further explained below.
 Used together with `ip-address` and `port` to uniquely identify a ssh daemon.
 This can be useful in a virtualized environment, where there can be more that
 one server that has the same `ip-address` and `port`. If this property is not
-explicitly set, it is assumed that the the `ip-address` and `port` uniquely
+explicitly set, it is assumed that the `ip-address` and `port` uniquely
 identifies the SSH daemon.
 """.
 -doc(#{title => <<"Common Options">>}).
diff -Ndurp otp_src_27.2/lib/crypto/test/engine_SUITE.erl otp_src_27.2-doc-the-the/lib/crypto/test/engine_SUITE.erl
--- otp_src_27.2/lib/crypto/test/engine_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/crypto/test/engine_SUITE.erl	2024-12-12 14:46:53.797467857 +0200
@@ -373,7 +373,7 @@ get_id_and_name(Config) when is_list(Con
 
 %%-------------------------------------------------------------------------
 engine_by_id()->
-    [{doc, "Test fetching a new reference the the engine when the"
+    [{doc, "Test fetching a new reference the engine when the"
      "engine id is added to the SSL engine list."}].
 
 engine_by_id(Config) when is_list(Config) ->
diff -Ndurp otp_src_27.2/lib/dialyzer/src/dialyzer_dataflow.erl otp_src_27.2-doc-the-the/lib/dialyzer/src/dialyzer_dataflow.erl
--- otp_src_27.2/lib/dialyzer/src/dialyzer_dataflow.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/dialyzer/src/dialyzer_dataflow.erl	2024-12-12 14:46:53.797467857 +0200
@@ -675,9 +675,9 @@ opaque_problems(ContractOrSigList, ArgTy
     ElementI <- lists:usort([EI || {_, EI} <- ArgElementList])].
 
 %% -> [{ArgN, ElementI}] where ElementI = 1 means there is an unknown
-%% opaque type in argument ArgN of the the contract/signature,
+%% opaque type in argument ArgN of the contract/signature,
 %% and ElementI = 2 means that there is an unknown opaque type in
-%% argument ArgN of the the (current) argument types.
+%% argument ArgN of the (current) argument types.
 find_unknown(ContractOrSigList, ArgTypes, Opaques, NoneArgNs) ->
   ArgNs = lists:seq(1, length(ArgTypes)),
   [{ArgN, ElementI} ||
diff -Ndurp otp_src_27.2/lib/dialyzer/test/opaque_SUITE_data/src/recrec/dialyzer_dataflow.erl otp_src_27.2-doc-the-the/lib/dialyzer/test/opaque_SUITE_data/src/recrec/dialyzer_dataflow.erl
--- otp_src_27.2/lib/dialyzer/test/opaque_SUITE_data/src/recrec/dialyzer_dataflow.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/dialyzer/test/opaque_SUITE_data/src/recrec/dialyzer_dataflow.erl	2024-12-12 14:46:53.797467857 +0200
@@ -709,9 +709,9 @@ opaque_problems(ContractOrSigList, ArgTy
     ElementI <- lists:usort([EI || {_, EI} <- ArgElementList])].
 
 %% -> [{ArgN, ElementI}] where ElementI = 1 means there is an unknown
-%% opaque type in argument ArgN of the the contract/signature,
+%% opaque type in argument ArgN of the contract/signature,
 %% and ElementI = 2 means that there is an unknown opaque type in
-%% argument ArgN of the the (current) argument types.
+%% argument ArgN of the (current) argument types.
 find_unknown(ContractOrSigList, ArgTypes, Opaques, NoneArgNs) ->
   ArgNs = lists:seq(1, length(ArgTypes)),
   [{ArgN, ElementI} ||
diff -Ndurp otp_src_27.2/lib/dialyzer/test/r9c_SUITE_data/src/asn1/asn1ct_check.erl otp_src_27.2-doc-the-the/lib/dialyzer/test/r9c_SUITE_data/src/asn1/asn1ct_check.erl
--- otp_src_27.2/lib/dialyzer/test/r9c_SUITE_data/src/asn1/asn1ct_check.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/dialyzer/test/r9c_SUITE_data/src/asn1/asn1ct_check.erl	2024-12-12 14:46:53.797467857 +0200
@@ -4411,7 +4411,7 @@ componentrelation_leadingattr(S,CompList
     %% get_simple_table_if_used/2 should find out whether there are any
     %% component relation constraints in the entire tree of Cs1 that
     %% relates to this level. It returns information about the simple
-    %% table constraint necessary for the the call to
+    %% table constraint necessary for the call to
     %% componentrelation_leadingattr/6. The step when the leading
     %% attribute and the syntax tree is modified to support the code
     %% generating.
diff -Ndurp otp_src_27.2/lib/dialyzer/test/r9c_SUITE_data/src/inets/httpd_request_handler.erl otp_src_27.2-doc-the-the/lib/dialyzer/test/r9c_SUITE_data/src/inets/httpd_request_handler.erl
--- otp_src_27.2/lib/dialyzer/test/r9c_SUITE_data/src/inets/httpd_request_handler.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/dialyzer/test/r9c_SUITE_data/src/inets/httpd_request_handler.erl	2024-12-12 14:46:53.797467857 +0200
@@ -637,7 +637,7 @@ read_trailer_end(Info,Timeout,MaxHdrSz,[
     end;
 read_trailer_end(Info,Timeout,MaxHdrSz,Trailers)->
     ?DEBUG("read_trailer_end()->Trailers: ~s ~n ",[Trailers]),
-    %% Get the last paart of the the last headerfield
+    %% Get the last paart of the last headerfield
     End=lists:reverse(lists:takewhile(fun(X)->case X of 10 ->false;13->false;_ ->true end end,lists:reverse(Trailers))),
     Fields0=regexp:split(Trailers,"\r\n"),
     %%Get rid of the last header field
diff -Ndurp otp_src_27.2/lib/dialyzer/test/small_SUITE_data/undefined.erl otp_src_27.2-doc-the-the/lib/dialyzer/test/small_SUITE_data/undefined.erl
--- otp_src_27.2/lib/dialyzer/test/small_SUITE_data/undefined.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/dialyzer/test/small_SUITE_data/undefined.erl	2024-12-12 14:46:53.797467857 +0200
@@ -10,7 +10,7 @@
 %% singleton type 'undefined' was never output.)
 %%
 %% One consequence is shown by the example below: the warning about
-%% the record construction violating the the declared type shows
+%% the record construction violating the declared type shows
 %% #r{..., d::'undefined', ...} which is meant to be of help to the
 %% user, who could otherwise get confused the first time (s)he gets
 %% confronted by the warning.
diff -Ndurp otp_src_27.2/lib/diameter/doc/notes.md otp_src_27.2-doc-the-the/lib/diameter/doc/notes.md
--- otp_src_27.2/lib/diameter/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/diameter/doc/notes.md	2024-12-12 14:46:53.797467857 +0200
@@ -1508,7 +1508,7 @@ Releases are listed in reverse chronolog
 
 - Fix #diameter_header\{\} handling broken by OTP-10445.
 
-  The fault caused the the header of a \[Header | Avps] request to be ignored if
+  The fault caused the header of a \[Header | Avps] request to be ignored if
   both end_to_end_id and hop_by_hop_id were undefined.
 
   Own Id: OTP-10609
diff -Ndurp otp_src_27.2/lib/diameter/doc/references/diameter_dict.md otp_src_27.2-doc-the-the/lib/diameter/doc/references/diameter_dict.md
--- otp_src_27.2/lib/diameter/doc/references/diameter_dict.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/diameter/doc/references/diameter_dict.md	2024-12-12 14:46:53.797467857 +0200
@@ -61,7 +61,7 @@ since the messages and AVPs it handles a
 ## FILE FORMAT
 
 A dictionary file consists of distinct sections. Each section starts with a tag
-followed by zero or more arguments and ends at the the start of the next section
+followed by zero or more arguments and ends at the start of the next section
 or end of file. Tags consist of an ampersand character followed by a keyword and
 are separated from their arguments by whitespace. Whitespace separates
 individual tokens but is otherwise insignificant.
@@ -112,7 +112,7 @@ order in which sections are specified is
   @prefix etsi_e2
   ```
 
-- **`@vendor Number Name`{: #vendor }** - Defines the integer Number as the the
+- **`@vendor Number Name`{: #vendor }** - Defines the integer Number as the
   default Vendor-Id of AVPs for which the V flag is set. Name documents the
   owner of the application but is otherwise unused. Can occur at most once and
   is required if an AVP sets the V flag and is not otherwise assigned a
diff -Ndurp otp_src_27.2/lib/diameter/src/base/diameter_app.erl otp_src_27.2-doc-the-the/lib/diameter/src/base/diameter_app.erl
--- otp_src_27.2/lib/diameter/src/base/diameter_app.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/diameter/src/base/diameter_app.erl	2024-12-12 14:46:53.801467763 +0200
@@ -42,7 +42,7 @@ functions themselves are of three distin
 - `c:handle_request/3` is called in response to an incoming Diameter request
   message.
 
-The arities for the the callback functions here assume no extra arguments. All
+The arities for the callback functions here assume no extra arguments. All
 functions will also be passed any extra arguments configured with the callback
 module itself when calling `diameter:start_service/2` and, for the call-specific
 callbacks, any extra arguments passed to `diameter:call/4`.
diff -Ndurp otp_src_27.2/lib/diameter/src/base/diameter_reg.erl otp_src_27.2-doc-the-the/lib/diameter/src/base/diameter_reg.erl
--- otp_src_27.2/lib/diameter/src/base/diameter_reg.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/diameter/src/base/diameter_reg.erl	2024-12-12 14:46:53.801467763 +0200
@@ -96,7 +96,7 @@ add(T) ->
 %% ===========================================================================
 %% # add_new(T)
 %%
-%% Like add/1 but only one process is allowed to have the the
+%% Like add/1 but only one process is allowed to have the
 %% association, false being returned if an association already exists.
 %% ===========================================================================
 
diff -Ndurp otp_src_27.2/lib/diameter/test/diameter_compiler_SUITE.erl otp_src_27.2-doc-the-the/lib/diameter/test/diameter_compiler_SUITE.erl
--- otp_src_27.2/lib/diameter/test/diameter_compiler_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/diameter/test/diameter_compiler_SUITE.erl	2024-12-12 14:46:53.801467763 +0200
@@ -67,7 +67,7 @@
 %% ===========================================================================
 
 %% RE/Replacement (in the sense of re:replace/4) pairs for morphing
-%% base_rfc3588.dia. The key is 'ok' or the the expected error as
+%% base_rfc3588.dia. The key is 'ok' or the expected error as
 %% returned in the first element of the error tuple returned by
 %% diameter_make:codec/2.
 -define(REPLACE,
diff -Ndurp otp_src_27.2/lib/erl_interface/doc/guides/ei_users_guide.md otp_src_27.2-doc-the-the/lib/erl_interface/doc/guides/ei_users_guide.md
--- otp_src_27.2/lib/erl_interface/doc/guides/ei_users_guide.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/erl_interface/doc/guides/ei_users_guide.md	2024-12-12 14:46:53.801467763 +0200
@@ -157,7 +157,7 @@ ei_x_new(&buf);
 ei_x_format_wo_ver(&buf, "{~a,~i}", "tobbe", 3928);
 ```
 
-For a complete description of the different format directives, see the the
+For a complete description of the different format directives, see the
 [`ei_x_format_wo_ver`](ei.md#ei_x_format_wo_ver) function.
 
 The following example is more complex:
diff -Ndurp otp_src_27.2/lib/erl_interface/doc/references/ei_connect.md otp_src_27.2-doc-the-the/lib/erl_interface/doc/references/ei_connect.md
--- otp_src_27.2/lib/erl_interface/doc/references/ei_connect.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/erl_interface/doc/references/ei_connect.md	2024-12-12 14:46:53.801467763 +0200
@@ -186,7 +186,7 @@ the following fields exist:
   If the `EI_SCLBK_FLG_FULL_IMPL` flag has been set, `tmo` contains timeout time
   in milliseconds.
 
-  This callback is optional. Set the `writev` field in the the
+  This callback is optional. Set the `writev` field in the
   `ei_socket_callbacks` structure to `NULL` if not implemented.
 
 - **`int (*write)(void *ctx, const char *buf, ssize_t *len, unsigned tmo)`** -
diff -Ndurp otp_src_27.2/lib/erl_interface/doc/references/ei.md otp_src_27.2-doc-the-the/lib/erl_interface/doc/references/ei.md
--- otp_src_27.2/lib/erl_interface/doc/references/ei.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/erl_interface/doc/references/ei.md	2024-12-12 14:46:53.801467763 +0200
@@ -350,7 +350,7 @@ The `t:iodata/0` term will be flattened
 the `outbuf` argument. The byte size of the `iodata` is written into the integer
 variable pointed to by the `size` argument. Both `size` and `outbuf` can be set
 to `NULL`. The integer pointed to by the `index` argument is updated to refer to
-the term following after the `t:iodata/0` term regardless of the the state of
+the term following after the `t:iodata/0` term regardless of the state of
 the `size` and the `outbuf` arguments.
 
 Note that the buffer pointed to by the `outbuf` argument must be large enough if
diff -Ndurp otp_src_27.2/lib/et/doc/guides/et_desc.md otp_src_27.2-doc-the-the/lib/et/doc/guides/et_desc.md
--- otp_src_27.2/lib/et/doc/guides/et_desc.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/et/doc/guides/et_desc.md	2024-12-12 14:46:53.801467763 +0200
@@ -111,7 +111,7 @@ Event = #event{}
 NewEvent = #event{}
 ```
 
-The interface of the filter function is the same as the the filter functions for
+The interface of the filter function is the same as the filter functions for
 the good old `lists:filtermap/2`. If the filter returns `false` it means that
 the trace data should silently be dropped. `true` means that the trace data data
 already is an `Event Record` and that it should be kept as it is. `true` means
diff -Ndurp otp_src_27.2/lib/eunit/include/eunit.hrl otp_src_27.2-doc-the-the/lib/eunit/include/eunit.hrl
--- otp_src_27.2/lib/eunit/include/eunit.hrl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/eunit/include/eunit.hrl	2024-12-12 14:46:53.801467763 +0200
@@ -19,7 +19,7 @@
 %% either the Apache License or the LGPL.
 %%
 %% NOTE: An object file that uses the macros in this header file shall
-%% never be considered a derived work under the the LGPL; these macros
+%% never be considered a derived work under the LGPL; these macros
 %% shall be regarded as "small" regardless of the exact line count.
 %%
 %% Copyright (C) 2004-2006 Mickaël Rémond, Richard Carlsson
diff -Ndurp otp_src_27.2/lib/inets/doc/notes.md otp_src_27.2-doc-the-the/lib/inets/doc/notes.md
--- otp_src_27.2/lib/inets/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/inets/doc/notes.md	2024-12-12 14:46:53.801467763 +0200
@@ -893,7 +893,7 @@ limitations under the License.
 ### Fixed Bugs and Malfunctions
 
 - Fixed bug that causes a crash in http client when using hostnames (e.g.
-  localhost) with the the option ipv6_host_with_brackets set to true.
+  localhost) with the option ipv6_host_with_brackets set to true.
 
   This change also fixes a regression: httpc:request fails with connection error
   (nxdomain) if option ipv6_host_with_brackets set to true and host component of
diff -Ndurp otp_src_27.2/lib/inets/test/httpc_SUITE.erl otp_src_27.2-doc-the-the/lib/inets/test/httpc_SUITE.erl
--- otp_src_27.2/lib/inets/test/httpc_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/inets/test/httpc_SUITE.erl	2024-12-12 14:46:53.801467763 +0200
@@ -419,7 +419,7 @@ get_space(Config) when is_list(Config) -
 %%--------------------------------------------------------------------
 post() ->
     [{doc, "Test http post request against local server. We do in this case "
-     "only care about the client side of the the post. The server "
+     "only care about the client side of the post. The server "
      "script will not actually use the post data."}, {timetrap, timer:seconds(30)}].
 post(Config) when is_list(Config) ->
     CGI = case os:type() of
@@ -444,7 +444,7 @@ post(Config) when is_list(Config) ->
 %%--------------------------------------------------------------------
 delete() ->
     [{doc, "Test http delete request against local server. We do in this case "
-     "only care about the client side of the the delete. The server "
+     "only care about the client side of the delete. The server "
      "script will not actually use the delete data."}, {timetrap, timer:seconds(30)}].
 delete(Config) when is_list(Config) ->
     CGI = case os:type() of
@@ -468,7 +468,7 @@ delete(Config) when is_list(Config) ->
 %%--------------------------------------------------------------------
 patch() ->
     [{"Test http patch request against local server. We do in this case "
-     "only care about the client side of the the patch. The server "
+     "only care about the client side of the patch. The server "
      "script will not actually use the patch data."}].
 patch(Config) when is_list(Config) ->
     CGI = case os:type() of
@@ -490,7 +490,7 @@ patch(Config) when is_list(Config) ->
 %%--------------------------------------------------------------------
 post_stream() ->
     [{doc, "Test streaming http post request against local server. "
-     "We only care about the client side of the the post. "
+     "We only care about the client side of the post. "
      "The server script will not actually use the post data."}, {timetrap, timer:seconds(30)}].
 post_stream(Config) when is_list(Config) ->
     CGI = case os:type() of
diff -Ndurp otp_src_27.2/lib/kernel/examples/gen_tcp_dist/src/gen_tcp_dist.erl otp_src_27.2-doc-the-the/lib/kernel/examples/gen_tcp_dist/src/gen_tcp_dist.erl
--- otp_src_27.2/lib/kernel/examples/gen_tcp_dist/src/gen_tcp_dist.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/examples/gen_tcp_dist/src/gen_tcp_dist.erl	2024-12-12 14:46:53.801467763 +0200
@@ -677,7 +677,7 @@ dist_cntrlr_setup_loop(Socket, TickHandl
             %% We use separate process for dispatching input. This
             %% is not necessary, but it enables parallel execution
             %% of independent work loads at the same time as it
-            %% simplifies the the implementation...
+            %% simplifies the implementation...
             InputHandler = spawn_opt(?MODULE, dist_cntrlr_input_setup,
                                      [DHandle, Socket, Sup],
                                      [link] ++ ?DIST_CNTRL_COMMON_SPAWN_OPTS),
diff -Ndurp otp_src_27.2/lib/kernel/src/code_server.erl otp_src_27.2-doc-the-the/lib/kernel/src/code_server.erl
--- otp_src_27.2/lib/kernel/src/code_server.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/src/code_server.erl	2024-12-12 14:46:53.801467763 +0200
@@ -865,7 +865,7 @@ try_archive_subdirs(_Archive, Base, [])
 
 %%
 %% Delete a directory from Path.
-%% Name can be either the the name in .../Name[-*] or
+%% Name can be either the name in .../Name[-*] or
 %% the complete directory name.
 %%
 del_path(Name0,Path,Cache,NameDb) ->
diff -Ndurp otp_src_27.2/lib/kernel/src/gen_udp_socket.erl otp_src_27.2-doc-the-the/lib/kernel/src/gen_udp_socket.erl
--- otp_src_27.2/lib/kernel/src/gen_udp_socket.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/src/gen_udp_socket.erl	2024-12-12 14:46:53.801467763 +0200
@@ -880,7 +880,7 @@ socket_setopt_opts([], _Socket, _Tag, _V
     ok;
 
 %% Its possible for *one* option to be mapped to several 'socket' options.
-%% For instance, when *setting* the the option recbuf, we actually set two
+%% For instance, when *setting* the option recbuf, we actually set two
 %% 'socket' options: {otp, rcvbuf} and {socket, rcvbuf}.
 socket_setopt_opts([{_Level, _OptKey} = Opt|Opts], Socket, Tag, Value) ->
     %% _ = socket:setopt(Socket, otp, debug, true),
diff -Ndurp otp_src_27.2/lib/kernel/src/socket.erl otp_src_27.2-doc-the-the/lib/kernel/src/socket.erl
--- otp_src_27.2/lib/kernel/src/socket.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/src/socket.erl	2024-12-12 14:46:53.805467669 +0200
@@ -6549,7 +6549,7 @@ and the `Value` argument is the value to
 
 These operations require elevated privileges.
 
-- **`sifflags`** - Set the the active flag word, `#{Flag => boolean()}`, of the
+- **`sifflags`** - Set the active flag word, `#{Flag => boolean()}`, of the
   interface with the specified name.
 
   Each flag to be changed should be added to the value `t:map/0`,
diff -Ndurp otp_src_27.2/lib/kernel/test/code_SUITE.erl otp_src_27.2-doc-the-the/lib/kernel/test/code_SUITE.erl
--- otp_src_27.2/lib/kernel/test/code_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/test/code_SUITE.erl	2024-12-12 14:46:53.805467669 +0200
@@ -2088,7 +2088,7 @@ delete_before_reload(Mod, Reload) ->
 
     Reload(),
 
-    %% When loading the the module with the -on_load() function,
+    %% When loading the module with the -on_load() function,
     %% the reference to the old code would be lost. Make sure that
     %% the old code is remembered and is still preventing the
     %% purge.
diff -Ndurp otp_src_27.2/lib/kernel/test/disk_log_SUITE.erl otp_src_27.2-doc-the-the/lib/kernel/test/disk_log_SUITE.erl
--- otp_src_27.2/lib/kernel/test/disk_log_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/test/disk_log_SUITE.erl	2024-12-12 14:46:53.805467669 +0200
@@ -4180,7 +4180,7 @@ change_size_truncate(Conf) when is_list(
     del(File, No),
 
     %% Part 2.
-    %% Change the size twice, the second time while the the effects of
+    %% Change the size twice, the second time while the effects of
     %% the first changed have not yet been handled. Finally close before
     %% the index file has been truncated.
 
diff -Ndurp otp_src_27.2/lib/kernel/test/socket_api_SUITE.erl otp_src_27.2-doc-the-the/lib/kernel/test/socket_api_SUITE.erl
--- otp_src_27.2/lib/kernel/test/socket_api_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/kernel/test/socket_api_SUITE.erl	2024-12-12 14:49:32.501621740 +0200
@@ -16097,7 +16097,7 @@ api_opt_sock_passcred_tcp(InitState) ->
 
 %%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
 
-%% Tests the the peek-off socket option for a unix domain socket
+%% Tests the peek-off socket option for a unix domain socket
 %% (stream TCP in this case).
 %%
 %% THIS IS A PLACEHOLDER!!
diff -Ndurp otp_src_27.2/lib/megaco/src/app/megaco.erl otp_src_27.2-doc-the-the/lib/megaco/src/app/megaco.erl
--- otp_src_27.2/lib/megaco/src/app/megaco.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/megaco/src/app/megaco.erl	2024-12-12 14:46:53.805467669 +0200
@@ -980,7 +980,7 @@ corresponding value can be of any type.[
 
   [](){: #ui_user_mod }
 
-- **`user_mod`** - Name of the user callback module. See the the reference
+- **`user_mod`** - Name of the user callback module. See the reference
   manual for megaco_user for more info.
 
   Value type: [module()](`t:erlang:module/0`)
@@ -990,7 +990,7 @@ corresponding value can be of any type.[
   [](){: #ui_user_args }
 
 - **`user_args`** - List of extra arguments to the user callback functions. See
-  the the reference manual for megaco_user for more info.
+  the reference manual for megaco_user for more info.
 
   Value type: [list()](`t:erlang:list/0`)
 
diff -Ndurp otp_src_27.2/lib/megaco/src/engine/megaco_trans_sender.erl otp_src_27.2-doc-the-the/lib/megaco/src/engine/megaco_trans_sender.erl
--- otp_src_27.2/lib/megaco/src/engine/megaco_trans_sender.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/megaco/src/engine/megaco_trans_sender.erl	2024-12-12 14:46:53.805467669 +0200
@@ -497,7 +497,7 @@ maybe_send_reqs(_CH, [], _Acks, Acc, Acc
 maybe_send_reqs(CH, [{Tid, Req}|Reqs], Acks, Acc, _AccSz, MaxSz, _Sent) 
   when is_binary(Req), byte_size(Req) >= MaxSz ->
     %% The request was above the maxsize limit, so first send 
-    %% what's in store and the the big request.
+    %% what's in store and the big request.
     ?d("maybe_send_reqs -> entry when request [~w] size (~w) > max size"
 	"~n   Acks:        ~w"
 	"~n   length(Acc): ~w", [Tid, byte_size(Req), Acks, length(Acc)]),
diff -Ndurp otp_src_27.2/lib/megaco/src/engine/megaco_user.erl otp_src_27.2-doc-the-the/lib/megaco/src/engine/megaco_user.erl
--- otp_src_27.2/lib/megaco/src/engine/megaco_user.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/megaco/src/engine/megaco_user.erl	2024-12-12 14:46:53.805467669 +0200
@@ -281,7 +281,7 @@ options:
 - **`Return pending()`** - Decide that the processing of these action requests
   will take a long time and that the originator should get an immediate
   'TransactionPending' reply as interim response. The actual processing of these
-  action requests instead should be delegated to the the
+  action requests instead should be delegated to the
   handle_trans_long_request/3 callback function with the req_data() as one of
   its arguments.
 
diff -Ndurp otp_src_27.2/lib/megaco/test/megaco_mess_otp8212_test.erl otp_src_27.2-doc-the-the/lib/megaco/test/megaco_mess_otp8212_test.erl
--- otp_src_27.2/lib/megaco/test/megaco_mess_otp8212_test.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/megaco/test/megaco_mess_otp8212_test.erl	2024-12-12 14:46:53.805467669 +0200
@@ -158,7 +158,7 @@ decode_message(_, V248, Bin) ->
 %%     i("send_message(scr) -> entry"),
 %%     ok;
 
-%% Outgoing request: fake reception of the the reply.
+%% Outgoing request: fake reception of the reply.
 send_message({RH, ControlPid, _, WrongMidStr}, _) ->
     %% i("send_message -> entry"),
     spawn(fun() -> receive_reply(200, RH, ControlPid, WrongMidStr) end),
diff -Ndurp otp_src_27.2/lib/megaco/test/megaco_test_deliver.erl otp_src_27.2-doc-the-the/lib/megaco/test/megaco_test_deliver.erl
--- otp_src_27.2/lib/megaco/test/megaco_test_deliver.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/megaco/test/megaco_test_deliver.erl	2024-12-12 14:46:53.805467669 +0200
@@ -24,7 +24,7 @@
 %%          the transport module. It is used when  delivering 
 %%          received messages. The purpose is to be able to do
 %%          various forms of filtering before passing the message 
-%%          the the megaco stack (by calling the megaco module).
+%%          the megaco stack (by calling the megaco module).
 %%          It can be controlled with the following flags:
 %%          allow_recv_message - Shall the received message be 
 %%                               delivered.
diff -Ndurp otp_src_27.2/lib/mnesia/src/mnesia.erl otp_src_27.2-doc-the-the/lib/mnesia/src/mnesia.erl
--- otp_src_27.2/lib/mnesia/src/mnesia.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/mnesia/src/mnesia.erl	2024-12-12 14:46:53.805467669 +0200
@@ -170,7 +170,7 @@ Mnesia reads the following application c
   overhead but increase disk space and startup times. Default is 4.
 - `-mnesia dir Directory`. The name of the directory where all Mnesia data is
   stored. The directory name must be unique for the current node. Two nodes must
-  never share the the same Mnesia directory. The results are unpredictable.
+  never share the same Mnesia directory. The results are unpredictable.
 - `-mnesia dump_disc_copies_at_startup true | false`. If set to false, this
   disables the dumping of `disc_copies` tables during startup while tables are
   being loaded. The default is true.
diff -Ndurp otp_src_27.2/lib/odbc/doc/guides/getting_started.md otp_src_27.2-doc-the-the/lib/odbc/doc/guides/getting_started.md
--- otp_src_27.2/lib/odbc/doc/guides/getting_started.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/odbc/doc/guides/getting_started.md	2024-12-12 14:46:53.805467669 +0200
@@ -28,7 +28,7 @@ running.
 - The first thing you need to do, is to make sure you have an ODBC driver
   installed for the database that you want to access. Both the client machine
   where you plan to run your erlang node and the server machine running the
-  database needs the the ODBC driver. (In some cases the client and the server
+  database needs the ODBC driver. (In some cases the client and the server
   may be the same machine).
 - Secondly you might need to set environment variables and paths to appropriate
   values. This may differ a lot between different os's, databases and ODBC
@@ -38,7 +38,7 @@ running.
   code is delivered as a precompiled executable for windows, solaris and linux
   (SLES10) in the commercial build. In the open source distribution it is built
   the same way as all other application using configure and make. You may want
-  to provide the the path to your ODBC libraries using --with-odbc=PATH.
+  to provide the path to your ODBC libraries using --with-odbc=PATH.
 
 > #### Note {: .info }
 >
diff -Ndurp otp_src_27.2/lib/odbc/test/odbc_query_SUITE.erl otp_src_27.2-doc-the-the/lib/odbc/test/odbc_query_SUITE.erl
--- otp_src_27.2/lib/odbc/test/odbc_query_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/odbc/test/odbc_query_SUITE.erl	2024-12-12 14:46:53.805467669 +0200
@@ -391,7 +391,7 @@ select_next(Config) when is_list(Config)
     {'EXIT',{function_clause, _}} = 
 	(catch odbc:select(Ref, next, 2, -1)),
 
-    %% If you try fetching data beyond the the end of result set,
+    %% If you try fetching data beyond the end of result set,
     %% you get an empty list.
     {selected, Fields, []} = odbc:select(Ref, next, 1),
 
diff -Ndurp otp_src_27.2/lib/parsetools/src/leex.erl otp_src_27.2-doc-the-the/lib/parsetools/src/leex.erl
--- otp_src_27.2/lib/parsetools/src/leex.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/parsetools/src/leex.erl	2024-12-12 14:46:53.805467669 +0200
@@ -999,7 +999,7 @@ parse_rules_end(_, NextLine, REAs, As, S
 
 %% collect_rule(File, Line, Lineno) ->
 %%      {ok,RegExp,ActionTokens,NewLineno} | {error,E}.
-%% Collect a complete rule by reading lines until the the regexp and
+%% Collect a complete rule by reading lines until the regexp and
 %% action has been read. Keep track of line number.
 
 collect_rule(Ifile, Chars, L0) ->
@@ -1445,7 +1445,7 @@ build_nfa(RE, N0, Action) ->
 %% build_nfa(RegExp, NextState, FirstState, NFA) -> {NFA,NextState,EndState}.
 %%  Build an NFA from the RegExp. NFA is a list of #nfa_state{} in no
 %%  predefined order. NextState is the number of the next free state
-%%  to use, FirstState is the the state which must be the start for
+%%  to use, FirstState is the state which must be the start for
 %%  this regexp as a previous regexp refers to it, EndState is the
 %%  state to which this NFA will exit to. The number of the returned
 %%  EndState is already allocated!
diff -Ndurp otp_src_27.2/lib/public_key/src/public_key.erl otp_src_27.2-doc-the-the/lib/public_key/src/public_key.erl
--- otp_src_27.2/lib/public_key/src/public_key.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/public_key/src/public_key.erl	2024-12-12 14:46:53.809467576 +0200
@@ -1852,7 +1852,7 @@ The option funs are described here:
   where you choose to accept an outdated certificate. This option enables
   implementation of such an exception but for hostnames. This `fun/1` is called
   when no `ReferenceID` matches. The return value of the fun (a `t:boolean/0`)
-  decides the outcome. If `true` the the certificate is accepted otherwise it is
+  decides the outcome. If `true` the certificate is accepted otherwise it is
   rejected. See
   ["Pinning" a Certificate](using_public_key.md#pinning-a-certificate) in the
   User's Guide.
diff -Ndurp otp_src_27.2/lib/snmp/doc/guides/snmp_agent_funct_descr.md otp_src_27.2-doc-the-the/lib/snmp/doc/guides/snmp_agent_funct_descr.md
--- otp_src_27.2/lib/snmp/doc/guides/snmp_agent_funct_descr.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/doc/guides/snmp_agent_funct_descr.md	2024-12-12 14:46:53.809467576 +0200
@@ -450,7 +450,7 @@ security parameters.
 
 ### SNMP-VIEW-BASED-ACM-MIB
 
-The SNMP-VIEW-BASED-ACM-MIB defines managed objects to control access to the the
+The SNMP-VIEW-BASED-ACM-MIB defines managed objects to control access to the
 managed objects for the managers. The View Based Access Control Module (VACM)
 can be used with any SNMP version. However, if it is used with SNMPv1 or
 SNMPv2c, the SNMP-COMMUNITY-MIB defines additional objects to map community
diff -Ndurp otp_src_27.2/lib/snmp/doc/guides/snmp_config.md otp_src_27.2-doc-the-the/lib/snmp/doc/guides/snmp_config.md
--- otp_src_27.2/lib/snmp/doc/guides/snmp_config.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/doc/guides/snmp_config.md	2024-12-12 14:46:53.809467576 +0200
@@ -701,7 +701,7 @@ Common config types:
 
 - **`atl_type() = read | write | read_write <optional>`{: #atl_type }** -
   Specifies what type of an audit trail log should be used. The effect of the
-  type is actually different for the the agent and the manager.
+  type is actually different for the agent and the manager.
 
   For the agent:
 
diff -Ndurp otp_src_27.2/lib/snmp/doc/snmp_app.md otp_src_27.2-doc-the-the/lib/snmp/doc/snmp_app.md
--- otp_src_27.2/lib/snmp/doc/snmp_app.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/doc/snmp_app.md	2024-12-12 14:46:53.809467576 +0200
@@ -701,7 +701,7 @@ Common config types:
 
 - **`atl_type() = read | write | read_write <optional>`{: #atl_type }** -
   Specifies what type of an audit trail log should be used. The effect of the
-  type is actually different for the the agent and the manager.
+  type is actually different for the agent and the manager.
 
   For the agent:
 
diff -Ndurp otp_src_27.2/lib/snmp/src/app/snmp.app.src otp_src_27.2-doc-the-the/lib/snmp/src/app/snmp.app.src
--- otp_src_27.2/lib/snmp/src/app/snmp.app.src	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/src/app/snmp.app.src	2024-12-12 14:46:53.809467576 +0200
@@ -127,7 +127,7 @@
   %% also started: snmp_agent_sup, snmp_local_db, snmp_master_agent,
   %%               snmp_misc_sup, snmpa_supervisor and 
   %%               snmp_symbolic_store
-  %% If an manager is configured, the the following processes is
+  %% If an manager is configured, the following processes is
   %% also started: snmpm_supervisor, snmpm_config, snmpm_server, 
   %%               snmpm_net_if 
   %%               
diff -Ndurp otp_src_27.2/lib/snmp/test/snmp_agent_SUITE.erl otp_src_27.2-doc-the-the/lib/snmp/test/snmp_agent_SUITE.erl
--- otp_src_27.2/lib/snmp/test/snmp_agent_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/test/snmp_agent_SUITE.erl	2024-12-12 14:46:53.809467576 +0200
@@ -5864,7 +5864,7 @@ snmpv2_mib_test_finish() ->
     ?expect2(v2trap, [{[sysUpTime,0], any},
 			    {[snmpTrapOID,0], ?authenticationFailure}]),
 
-    %% and the the inform
+    %% and the inform
     ?DBG("ma_v2_inform -> await inform",[]),
     ?expect2({inform,true}, [{[sysUpTime,0], any},
 				   {[snmpTrapOID,0],?authenticationFailure}]).
diff -Ndurp otp_src_27.2/lib/snmp/test/test-mibs/ENTITY-MIB.mib otp_src_27.2-doc-the-the/lib/snmp/test/test-mibs/ENTITY-MIB.mib
--- otp_src_27.2/lib/snmp/test/test-mibs/ENTITY-MIB.mib	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/test/test-mibs/ENTITY-MIB.mib	2024-12-12 14:46:53.809467576 +0200
@@ -219,7 +219,7 @@ entPhysicalParentRelPos OBJECT-TYPE
             any external numbering or clearly visible ordering, then
             user documentation or other external reference material
             should be used to determine the parent-relative position. If
-            this is not possible, then the the agent should assign a
+            this is not possible, then the agent should assign a
             consistent (but possibly arbitrary) ordering to a given set
             of 'sibling' components, perhaps based on internal
             representation of the components.
diff -Ndurp otp_src_27.2/lib/snmp/test/test-mibs/RMON2-MIB.mib otp_src_27.2-doc-the-the/lib/snmp/test/test-mibs/RMON2-MIB.mib
--- otp_src_27.2/lib/snmp/test/test-mibs/RMON2-MIB.mib	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/snmp/test/test-mibs/RMON2-MIB.mib	2024-12-12 14:46:53.809467576 +0200
@@ -484,7 +484,7 @@ protocolDirMatrixConfig OBJECT-TYPE
         implemented but don't have the capability to track this
         protocol.  Note that if the alMatrix tables are implemented,
         the probe may only support a protocol if it is supported in
-        the the both of the nlMatrixTables and both of the
+        the both of the nlMatrixTables and both of the
         alMatrixTables.
 
         If the associated protocolDirType object has the
diff -Ndurp otp_src_27.2/lib/ssh/doc/guides/configurations.md otp_src_27.2-doc-the-the/lib/ssh/doc/guides/configurations.md
--- otp_src_27.2/lib/ssh/doc/guides/configurations.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssh/doc/guides/configurations.md	2024-12-12 14:46:53.809467576 +0200
@@ -329,6 +329,6 @@ This example showed that we could augmen
 config-file without the need to change the actual call.
 
 For demonstration purposes we used `prepend` instead of `append`. This forces
-the negotiation to select `ssh-dss` since the the full list of public key
+the negotiation to select `ssh-dss` since the full list of public key
 algorithms was `['ssh-dss','ecdsa-sha2-nistp256']`. Normally it is safer to
 append a non-default algorithm.
diff -Ndurp otp_src_27.2/lib/ssh/doc/notes.md otp_src_27.2-doc-the-the/lib/ssh/doc/notes.md
--- otp_src_27.2/lib/ssh/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssh/doc/notes.md	2024-12-12 14:46:53.809467576 +0200
@@ -1110,7 +1110,7 @@ limitations under the License.
 
 - The ssh agent is now implemented in the ssh_agent key callback module.
 
-  Enable with the the option `{key_cb, {ssh_agent, []}}` in for example
+  Enable with the option `{key_cb, {ssh_agent, []}}` in for example
   ssh:connect/3.
 
   See the [ssh_agent manual](`m:ssh_agent`) for details.
@@ -1252,7 +1252,7 @@ limitations under the License.
 
 - If an OTP SSH server was serving an "exec" request and the executed code used
   Erlang `standard_io` for input/output, the I/O was erroneously handled by the
-  _server's_ group leader, so the I/O turned up in the the server's Erlang shell
+  _server's_ group leader, so the I/O turned up in the server's Erlang shell
   (if any). The user at the client side did therefore not see that I/O.
 
   This is corrected now, so the client - for example the ssh OS shell command -
diff -Ndurp otp_src_27.2/lib/ssh/src/ssh_client_key_api.erl otp_src_27.2-doc-the-the/lib/ssh/src/ssh_client_key_api.erl
--- otp_src_27.2/lib/ssh/src/ssh_client_key_api.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssh/src/ssh_client_key_api.erl	2024-12-12 14:46:53.809467576 +0200
@@ -124,7 +124,7 @@ modules may return `{ssh2_pubkey, PubKey
 
 
 %%%****************************************************************
-%%% Remembers that the the public key Key is a key for the host(s)
+%%% Remembers that the public key Key is a key for the host(s)
 %%% in the argument Host with the port Port.
 %%%
 %%% Due to compatibility reasons, the OTP/SSH application first
diff -Ndurp otp_src_27.2/lib/ssh/src/ssh.hrl otp_src_27.2-doc-the-the/lib/ssh/src/ssh.hrl
--- otp_src_27.2/lib/ssh/src/ssh.hrl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssh/src/ssh.hrl	2024-12-12 14:46:53.809467576 +0200
@@ -355,7 +355,7 @@ further explained below.
 Used together with `ip-address` and `port` to uniquely identify a ssh daemon.
 This can be useful in a virtualized environment, where there can be more that
 one server that has the same `ip-address` and `port`. If this property is not
-explicitly set, it is assumed that the the `ip-address` and `port` uniquely
+explicitly set, it is assumed that the `ip-address` and `port` uniquely
 identifies the SSH daemon.
 """.
 -doc(#{title => <<"Common Options">>}).
diff -Ndurp otp_src_27.2/lib/ssl/doc/guides/ssl_distribution.md otp_src_27.2-doc-the-the/lib/ssl/doc/guides/ssl_distribution.md
--- otp_src_27.2/lib/ssl/doc/guides/ssl_distribution.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/doc/guides/ssl_distribution.md	2024-12-12 14:46:53.813467480 +0200
@@ -200,7 +200,7 @@ calling `ssl:connect/4`.
 For the client, the option `{server_name_indication, atom_to_list(TargetNode)}`
 is added when connecting. This makes it possible to use the client option
 `{verify, verify_peer}`, and the client will verify that the certificate matches
-the node name you are connecting to. This only works if the the server
+the node name you are connecting to. This only works if the server
 certificate is issued to the name
 [`atom_to_list(TargetNode)`](`atom_to_list/1`).
 
diff -Ndurp otp_src_27.2/lib/ssl/doc/guides/using_ssl.md otp_src_27.2-doc-the-the/lib/ssl/doc/guides/using_ssl.md
--- otp_src_27.2/lib/ssl/doc/guides/using_ssl.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/doc/guides/using_ssl.md	2024-12-12 14:46:53.813467480 +0200
@@ -573,7 +573,7 @@ Step 4 - Not Possible to Reuse Explicit
                    18,17,174,39,...>>}]}
 ```
 
-On the server side the the `{reuse_sessions, boolean()}` option determines if
+On the server side the `{reuse_sessions, boolean()}` option determines if
 the server will save session data and allow session reuse or not. This can be
 further customized by the option `{reuse_session, fun()}` that may introduce a
 local policy for session reuse.
diff -Ndurp otp_src_27.2/lib/ssl/doc/notes.md otp_src_27.2-doc-the-the/lib/ssl/doc/notes.md
--- otp_src_27.2/lib/ssl/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/doc/notes.md	2024-12-12 14:49:11.582116917 +0200
@@ -54,7 +54,7 @@ This document describes the changes made
 
 ### Improvements and New Features
 
-- Back port certificate_authorities option for TLS-1.3 servers to pre TLS-1.3 servers to enable them to disable the sending of certificate authorities in their certificate request. This will have same affect as the the TLS-1.3 server option although it is handled by a different mechanism in these versions, where the functionality is described to be more of a guidance, although some pre TLS clients have proven to make it mandatory as in TLS-1.3 extension handling.
+- Back port certificate_authorities option for TLS-1.3 servers to pre TLS-1.3 servers to enable them to disable the sending of certificate authorities in their certificate request. This will have same affect as the TLS-1.3 server option although it is handled by a different mechanism in these versions, where the functionality is described to be more of a guidance, although some pre TLS clients have proven to make it mandatory as in TLS-1.3 extension handling.
 
   Own Id: OTP-19325 Aux Id: [PR-9001], ERIERL-1147
 
@@ -73,7 +73,7 @@ This document describes the changes made
   Own Id: OTP-19274 Aux Id: [PR-8901]
 
 - Fix assertion so that works as intended.
-  This could result in that some TLS-1.2 clients would fail to connect to the the erlang server.  Bug introduced in OTP-27.1.1
+  This could result in that some TLS-1.2 clients would fail to connect to the erlang server.  Bug introduced in OTP-27.1.1
 
   Own Id: OTP-19288 Aux Id: [GH-8908], [PR-8916]
 
@@ -270,7 +270,7 @@ This document describes the changes made
 
 ### Improvements and New Features
 
-* Back port certificate_authorities option for TLS-1.3 servers to pre TLS-1.3 servers to enable them to disable the sending of certificate authorities in their certificate request. This will have same affect as the the TLS-1.3 server option although it is handled by a different mechanism in these versions, where the functionality is described to be more of a guidance, although some pre TLS clients have proven to make it mandatory as in TLS-1.3 extension handling.
+* Back port certificate_authorities option for TLS-1.3 servers to pre TLS-1.3 servers to enable them to disable the sending of certificate authorities in their certificate request. This will have same affect as the TLS-1.3 server option although it is handled by a different mechanism in these versions, where the functionality is described to be more of a guidance, although some pre TLS clients have proven to make it mandatory as in TLS-1.3 extension handling.
 
   Own Id: OTP-19325 Aux Id: PR-9001, ERIERL-1147
 
diff -Ndurp otp_src_27.2/lib/ssl/src/ssl_certificate.erl otp_src_27.2-doc-the-the/lib/ssl/src/ssl_certificate.erl
--- otp_src_27.2/lib/ssl/src/ssl_certificate.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/src/ssl_certificate.erl	2024-12-12 14:46:53.813467480 +0200
@@ -415,7 +415,7 @@ build_certificate_chain(#cert{otp=OtpCer
 		    do_certificate_chain(CertDbHandle, CertsDbRef, Chain,
 					 SerialNr, Issuer, SelfSigned, ListDb);
 		_Err ->
-		    %% Guess the the issuer must be the root
+		    %% Guess the issuer must be the root
 		    %% certificate. The verification of the
 		    %% cert chain will fail if guess is
 		    %% incorrect.
diff -Ndurp otp_src_27.2/lib/ssl/src/ssl.erl otp_src_27.2-doc-the-the/lib/ssl/src/ssl.erl
--- otp_src_27.2/lib/ssl/src/ssl.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/src/ssl.erl	2024-12-12 14:46:53.813467480 +0200
@@ -2904,7 +2904,7 @@ preferred cipher list.
 %%      suites that is put them at the head of the cipher suite list
 %%      and remove them from <Suites> if present. <Preferred> may be a
 %%      list of cipher suites or a list of filters in which case the
-%%      filters are use on Suites to extract the the preferred
+%%      filters are use on Suites to extract the preferred
 %%      cipher list.
 %% --------------------------------------------------------------------
 prepend_cipher_suites([First | _] = Preferred, Suites0) when is_map(First) ->
diff -Ndurp otp_src_27.2/lib/ssl/test/ssl_cert_SUITE.erl otp_src_27.2-doc-the-the/lib/ssl/test/ssl_cert_SUITE.erl
--- otp_src_27.2/lib/ssl/test/ssl_cert_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/ssl/test/ssl_cert_SUITE.erl	2024-12-12 14:46:53.813467480 +0200
@@ -1408,7 +1408,7 @@ hello_retry_client_auth_empty_cert_rejec
 
 %%--------------------------------------------------------------------
 signature_algorithms_bad_curve_secp256r1() ->
-     [{doc,"TLS 1.3: Test that the the client fails to connect "
+     [{doc,"TLS 1.3: Test that the client fails to connect "
        "if server's certificate has a key using an unsupported curve."}].
 
 signature_algorithms_bad_curve_secp256r1(Config) ->
@@ -1425,7 +1425,7 @@ signature_algorithms_bad_curve_secp256r1
 
 %%--------------------------------------------------------------------
 signature_algorithms_bad_curve_secp384r1() ->
-     [{doc,"TLS 1.3: Test that the the client fails to connect "
+     [{doc,"TLS 1.3: Test that the client fails to connect "
        "if server's certificate has a key using an unsupported curve."}].
 
 signature_algorithms_bad_curve_secp384r1(Config) ->
@@ -1442,7 +1442,7 @@ signature_algorithms_bad_curve_secp384r1
 
 %%--------------------------------------------------------------------
 signature_algorithms_bad_curve_secp521r1() ->
-     [{doc,"TLS 1.3: Test that the the client fails to connect "
+     [{doc,"TLS 1.3: Test that the client fails to connect "
        "if server's certificate has a key using an unsupported curve."}].
 
 signature_algorithms_bad_curve_secp521r1(Config) ->
diff -Ndurp otp_src_27.2/lib/stdlib/doc/guides/io_protocol.md otp_src_27.2-doc-the-the/lib/stdlib/doc/guides/io_protocol.md
--- otp_src_27.2/lib/stdlib/doc/guides/io_protocol.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/doc/guides/io_protocol.md	2024-12-12 14:46:53.813467480 +0200
@@ -443,7 +443,7 @@ loop(State) ->
     end.
 ```
 
-The main loop receives messages from the client (which can use the the `m:io`
+The main loop receives messages from the client (which can use the `m:io`
 module to send requests). For each request, the function `request/2` is called
 and a reply is eventually sent using function `reply/3`.
 
diff -Ndurp otp_src_27.2/lib/stdlib/doc/notes.md otp_src_27.2-doc-the-the/lib/stdlib/doc/notes.md
--- otp_src_27.2/lib/stdlib/doc/notes.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/doc/notes.md	2024-12-12 14:46:53.813467480 +0200
@@ -1878,7 +1878,7 @@ This document describes the changes made
 
   Own Id: OTP-17434 Aux Id: GH-4772
 
-- Calling `c:ls/1` with an atom whose contents is the the name of a file (as
+- Calling `c:ls/1` with an atom whose contents is the name of a file (as
   opposed to a directory) would crash.
 
   Own Id: OTP-17463 Aux Id: GH-4916
@@ -7461,7 +7461,7 @@ This document describes the changes made
     a crash.
   - If a QLC restricted some column of a table in such a way that a traversal
     using a match specification was possible and the QLC also compared the key
-    column or some indexed column of the the table with a column of some other
+    column or some indexed column of the table with a column of some other
     table, `qlc` always chose to traverse the table first, never considering
     lookup join. This has been changed so that lookup join is always preferred;
     if an initial traversal using the match specification is desired, the query
diff -Ndurp otp_src_27.2/lib/stdlib/doc/src/re.md otp_src_27.2-doc-the-the/lib/stdlib/doc/src/re.md
--- otp_src_27.2/lib/stdlib/doc/src/re.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/doc/src/re.md	2024-12-12 14:46:53.813467480 +0200
@@ -485,7 +485,7 @@ current matching point is at the end of
 is no character to match.
 
 For compatibility with Perl, `\s` did not used to match the VT character (code
-11), which made it different from the the POSIX "space" class. However, Perl
+11), which made it different from the POSIX "space" class. However, Perl
 added VT at release 5.18, and PCRE followed suit at release 8.34. The default
 `\s` characters are now HT (9), LF (10), VT (11), FF (12), CR (13), and space
 (32), which are defined as white space in the "C" locale. This list may vary if
diff -Ndurp otp_src_27.2/lib/stdlib/src/calendar.erl otp_src_27.2-doc-the-the/lib/stdlib/src/calendar.erl
--- otp_src_27.2/lib/stdlib/src/calendar.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/calendar.erl	2024-12-12 14:46:53.813467480 +0200
@@ -190,7 +190,7 @@ The time unit used by the rfc3339 conver
 
 %%----------------------------------------------------------------------
 
-%% All dates are according the the Gregorian calendar. In this module
+%% All dates are according the Gregorian calendar. In this module
 %% the Gregorian calendar is extended back to year 0 for convenience.
 %%
 %% A year Y is a leap year if and only if either
diff -Ndurp otp_src_27.2/lib/stdlib/src/c.erl otp_src_27.2-doc-the-the/lib/stdlib/src/c.erl
--- otp_src_27.2/lib/stdlib/src/c.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/c.erl	2024-12-12 14:46:53.813467480 +0200
@@ -126,7 +126,7 @@ compiler options and source path. If the
 original location, `filelib:find_source/1` is used to search for it relative to
 the directory of the object file.
 
-The source file is compiled with the the original options appended to the given
+The source file is compiled with the original options appended to the given
 `Options`, the output replacing the old object file if and only if compilation
 succeeds.
 
@@ -173,7 +173,7 @@ extract its original compiler options an
 found in the original location, `filelib:find_source/1` is used to search for it
 relative to the directory of the object file.
 
-The source file is compiled with the the original options appended to the given
+The source file is compiled with the original options appended to the given
 `Options`, the output replacing the old object file if and only if compilation
 succeeds. The function `Filter` specifies which elements to remove from the
 original compiler options before the new options are added. The `Filter` fun
diff -Ndurp otp_src_27.2/lib/stdlib/src/erl_compile.erl otp_src_27.2-doc-the-the/lib/stdlib/src/erl_compile.erl
--- otp_src_27.2/lib/stdlib/src/erl_compile.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/erl_compile.erl	2024-12-12 14:46:53.813467480 +0200
@@ -65,7 +65,7 @@ compile(Args, Cwd) ->
             {crash, {C,E,Stk}}
     end.
 
-%% Run the the compiler in a separate process.
+%% Run the compiler in a separate process.
 compile_cmdline1(Args) ->
     {ok, Cwd} = file:get_cwd(),
     {Pid,Ref} = spawn_monitor(fun() -> exit(compile(Args, Cwd)) end),
diff -Ndurp otp_src_27.2/lib/stdlib/src/gen_event.erl otp_src_27.2-doc-the-the/lib/stdlib/src/gen_event.erl
--- otp_src_27.2/lib/stdlib/src/gen_event.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/gen_event.erl	2024-12-12 14:46:53.817467386 +0200
@@ -1484,7 +1484,7 @@ is the callback module of `NewHandler`,
 of [`OldModule:terminate/2`](`c:terminate/2`).  This makes it possible
 to transfer information from `OldHandler` to `NewHandler`.
 
-The new handler is added even if the the specified old event handler
+The new handler is added even if the specified old event handler
 is not installed, in which case `Term = error`, or if
 [`OldModule:terminate/2`](`c:terminate/2`) fails with `Reason`,
 in which case `Term = {'EXIT', Reason}`.  The old handler
diff -Ndurp otp_src_27.2/lib/stdlib/src/gen_statem.erl otp_src_27.2-doc-the-the/lib/stdlib/src/gen_statem.erl
--- otp_src_27.2/lib/stdlib/src/gen_statem.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/gen_statem.erl	2024-12-12 14:46:53.817467386 +0200
@@ -908,7 +908,7 @@ If `Time` is `infinity`, no timer is sta
 as it never would expire anyway.
 
 If `Time` is relative and `0` no timer is actually started,
-instead the the time-out event is enqueued to ensure
+instead the time-out event is enqueued to ensure
 that it gets processed before any not yet received external event,
 but after already queued events.
 
@@ -992,7 +992,7 @@ If `Time` is `infinity`, no timer is sta
 as it never would expire anyway.
 
 If `Time` is relative and `0` no timer is actually started,
-instead the the time-out event is enqueued to ensure
+instead the time-out event is enqueued to ensure
 that it gets processed before any not yet received external event.
 
 Setting this timer while it is running will restart it
diff -Ndurp otp_src_27.2/lib/stdlib/src/math.erl otp_src_27.2-doc-the-the/lib/stdlib/src/math.erl
--- otp_src_27.2/lib/stdlib/src/math.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/math.erl	2024-12-12 14:46:53.817467386 +0200
@@ -22,7 +22,7 @@
 Mathematical functions.
 
 This module provides an interface to a number of mathematical functions.
-For details about what each function does, see the the C library documentation
+For details about what each function does, see the C library documentation
 on your system. On Unix systems the easiest way it to run `man sin`. On
 Windows you should check the [Math and floating-point support](https://learn.microsoft.com/en-us/cpp/c-runtime-library/floating-point-support)
 documentation.
diff -Ndurp otp_src_27.2/lib/stdlib/src/peer.erl otp_src_27.2-doc-the-the/lib/stdlib/src/peer.erl
--- otp_src_27.2/lib/stdlib/src/peer.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/peer.erl	2024-12-12 14:46:53.817467386 +0200
@@ -511,7 +511,7 @@ cast(Dest, M, F, A) ->
 %%  using alternative connection. No delivery guarantee.
 -ifndef(NO_DOCS).
 -doc "
-Uses the alternative connection to send Message to a process on the the peer node.
+Uses the alternative connection to send Message to a process on the peer node.
 
 Silently fails if no alternative connection is configured. The process can
 be referenced by process ID or registered name.
diff -Ndurp otp_src_27.2/lib/stdlib/src/rand.erl otp_src_27.2-doc-the-the/lib/stdlib/src/rand.erl
--- otp_src_27.2/lib/stdlib/src/rand.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/rand.erl	2024-12-12 14:46:53.817467386 +0200
@@ -2230,7 +2230,7 @@ a `t:float/0` of very good quality.
 The low bits of the base generator are surprisingly good, so the lowest
 16 bits actually pass fairly strict PRNG tests, despite the generator's
 weaknesses that lie in the high bits of the 32-bit MWC "digit".
-It is recommended to use `rem` on the the generator state, or bit mask
+It is recommended to use `rem` on the generator state, or bit mask
 extracting the lowest bits to produce numbers in a range 16 bits or less.
 See the recepies at the start of this
 [Niche algorithms API](#niche-algorithms-api) description.
diff -Ndurp otp_src_27.2/lib/stdlib/src/slave.erl otp_src_27.2-doc-the-the/lib/stdlib/src/slave.erl
--- otp_src_27.2/lib/stdlib/src/slave.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/src/slave.erl	2024-12-12 14:46:53.817467386 +0200
@@ -260,7 +260,7 @@ otherwise `{error, Reason}`, where `Reas
   This can occur in a number of circumstances:
 
   - Erlang/OTP is not installed on the remote host.
-  - The file system on the other host has a different structure to the the
+  - The file system on the other host has a different structure to the
     master.
   - The Erlang nodes have different cookies.
 
diff -Ndurp otp_src_27.2/lib/stdlib/test/rand_SUITE.erl otp_src_27.2-doc-the-the/lib/stdlib/test/rand_SUITE.erl
--- otp_src_27.2/lib/stdlib/test/rand_SUITE.erl	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/test/rand_SUITE.erl	2024-12-12 14:46:53.817467386 +0200
@@ -741,7 +741,7 @@ stats_standard_normal(Fun, S, Retries) -
           4.0), % probability erfc(4.0/sqrt(2)) (1/15787) to fail a bucket
 %%%
     ct:timetrap({seconds, Seconds + 120}),
-    %% Buckets is chosen to get a range where the the probability to land
+    %% Buckets is chosen to get a range where the probability to land
     %% in the top catch-all bucket is not vanishingly low, but with
     %% these values it is about 1/25 of the probability for the low bucket
     %% (closest to 0).
diff -Ndurp otp_src_27.2/lib/stdlib/test/shell_docs_SUITE_data/stdlib_re.txt otp_src_27.2-doc-the-the/lib/stdlib/test/shell_docs_SUITE_data/stdlib_re.txt
--- otp_src_27.2/lib/stdlib/test/shell_docs_SUITE_data/stdlib_re.txt	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/stdlib/test/shell_docs_SUITE_data/stdlib_re.txt	2024-12-12 14:47:17.136898010 +0200
@@ -529,7 +529,7 @@
   there is no character to match.
 
   For compatibility with Perl, [;;4m\s[0m did not used to match the VT
-  character (code 11), which made it different from the the POSIX
+  character (code 11), which made it different from the POSIX
   "space" class. However, Perl added VT at release 5.18, and PCRE
   followed suit at release 8.34. The default [;;4m\s[0m characters are now
   HT (9), LF (10), VT (11), FF (12), CR (13), and space (32), which
diff -Ndurp otp_src_27.2/lib/tools/emacs/internal_doc/emacs.sgml otp_src_27.2-doc-the-the/lib/tools/emacs/internal_doc/emacs.sgml
--- otp_src_27.2/lib/tools/emacs/internal_doc/emacs.sgml	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/tools/emacs/internal_doc/emacs.sgml	2024-12-12 14:46:53.821467292 +0200
@@ -1780,7 +1780,7 @@ the created <C>TAGS</C> file.
 
 <P>
 Create a <C>TAGS</C> file of all the Erlang files in the Erlang
-distribution.  The <C>TAGS</C> file will be placed in the the directory
+distribution.  The <C>TAGS</C> file will be placed in the directory
 <C>bar</C>.
 </P>
 
@@ -3002,7 +3002,7 @@ tall window.
 <P>
 The line at the bottom of each Emacs window that contain information
 about the buffer.  E.g. the name of the buffer, the line number, and
-the name of the the current major mode.
+the name of the current major mode.
 </P>
 
   <ITEM><C> nil </C> 
diff -Ndurp otp_src_27.2/lib/wx/AUTHORS otp_src_27.2-doc-the-the/lib/wx/AUTHORS
--- otp_src_27.2/lib/wx/AUTHORS	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/wx/AUTHORS	2024-12-12 14:46:53.821467292 +0200
@@ -3,7 +3,7 @@ Dan Gudmundsson main work.
 
 Matthew Harrison wrote examples, code and helped debugging.
 
-Mats-Ola Persson wrote the the initial <em>wxWidgets</em> binding as
+Mats-Ola Persson wrote the initial <em>wxWidgets</em> binding as
 part of his master thesis.
 
 Olle Mattsson wrote most of the demo in examples.
diff -Ndurp otp_src_27.2/lib/xmerl/test/xmerl_SUITE_data/eventp/CelloMOM.xml otp_src_27.2-doc-the-the/lib/xmerl/test/xmerl_SUITE_data/eventp/CelloMOM.xml
--- otp_src_27.2/lib/xmerl/test/xmerl_SUITE_data/eventp/CelloMOM.xml	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/xmerl/test/xmerl_SUITE_data/eventp/CelloMOM.xml	2024-12-12 14:46:53.825467198 +0200
@@ -14736,7 +14736,7 @@ SILI -switch internal link interface.
             </dataType>
         </attribute>
         <attribute name="operationalStateSil">
-            <description>Operational state indicates the the traffic handling capability of all ports as a group on the board, i.e it is enabled if one or more of the eight ports is enabled. The purpose of this attribute is only for test.</description>
+            <description>Operational state indicates the traffic handling capability of all ports as a group on the board, i.e it is enabled if one or more of the eight ports is enabled. The purpose of this attribute is only for test.</description>
             <noNotification/>
             <nonPersistent/>
             <readOnly/>
@@ -25394,7 +25394,7 @@ rtoAlphaIndex = 4 -&gt; RTO-Alpha = 1/16
             </dataType>
         </attribute>
         <attribute name="rtoBetaIndex">
-            <description>This parameter is used for computing the the value of RTTVar (Round Trip Time Variation) of a destination
+            <description>This parameter is used for computing the value of RTTVar (Round Trip Time Variation) of a destination
 address. 
 It's value must be between 0 and 1 (0 &lt; rtoBetaIndex &lt; 1). A value close to 1 gives more importance to the
 last observed variation.
@@ -25467,7 +25467,7 @@ Unit is seconds.</description>
 
 The value of this attribute should be greater than, or equal to the value of the attribute 'pathMaxRtx'.
 
-Note that for a specific association, it might happen that all the remote addresses (if the the remote end is multi homed) becomes unreachable without exceeding the 'associationMaxRtx'. In such a case the association will be closed down.
+Note that for a specific association, it might happen that all the remote addresses (if the remote end is multi homed) becomes unreachable without exceeding the 'associationMaxRtx'. In such a case the association will be closed down.
 
 Note! The value need to be increased to avoid frequent CommLost's in case of an unstable network.</description>
             <dataType>
@@ -27609,7 +27609,7 @@ The local distinguished name of this MO
         <attribute name="emergencyStateInfo">
             <description>This attribute holds information about the emergency status and the time remaining in the current state.
 
-Note! If the node is in emergency state USE_DEGRADED, or the emergency state is USE_DISABLED, the the value of'time' is insignificant.</description>
+Note! If the node is in emergency state USE_DEGRADED, or the emergency state is USE_DISABLED, the value of'time' is insignificant.</description>
             <noNotification/>
             <readOnly/>
             <dataType>
diff -Ndurp otp_src_27.2/lib/xmerl/test/xmerl_SUITE_data/eventp/CMOM.xml otp_src_27.2-doc-the-the/lib/xmerl/test/xmerl_SUITE_data/eventp/CMOM.xml
--- otp_src_27.2/lib/xmerl/test/xmerl_SUITE_data/eventp/CMOM.xml	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/lib/xmerl/test/xmerl_SUITE_data/eventp/CMOM.xml	2024-12-12 14:46:53.829467105 +0200
@@ -14736,7 +14736,7 @@ SILI -switch internal link interface.
             </dataType>
         </attribute>
         <attribute name="operationalStateSil">
-            <description>Operational state indicates the the traffic handling capability of all ports as a group on the board, i.e it is enabled if one or more of the eight ports is enabled. The purpose of this attribute is only for test.</description>
+            <description>Operational state indicates the traffic handling capability of all ports as a group on the board, i.e it is enabled if one or more of the eight ports is enabled. The purpose of this attribute is only for test.</description>
             <noNotification/>
             <nonPersistent/>
             <readOnly/>
@@ -25394,7 +25394,7 @@ rtoAlphaIndex = 4 -&gt; RTO-Alpha = 1/16
             </dataType>
         </attribute>
         <attribute name="rtoBetaIndex">
-            <description>This parameter is used for computing the the value of RTTVar (Round Trip Time Variation) of a destination
+            <description>This parameter is used for computing the value of RTTVar (Round Trip Time Variation) of a destination
 address. 
 It's value must be between 0 and 1 (0 &lt; rtoBetaIndex &lt; 1). A value close to 1 gives more importance to the
 last observed variation.
@@ -25467,7 +25467,7 @@ Unit is seconds.</description>
 
 The value of this attribute should be greater than, or equal to the value of the attribute 'pathMaxRtx'.
 
-Note that for a specific association, it might happen that all the remote addresses (if the the remote end is multi homed) becomes unreachable without exceeding the 'associationMaxRtx'. In such a case the association will be closed down.
+Note that for a specific association, it might happen that all the remote addresses (if the remote end is multi homed) becomes unreachable without exceeding the 'associationMaxRtx'. In such a case the association will be closed down.
 
 Note! The value need to be increased to avoid frequent CommLost's in case of an unstable network.</description>
             <dataType>
@@ -27609,7 +27609,7 @@ The local distinguished name of this MO
         <attribute name="emergencyStateInfo">
             <description>This attribute holds information about the emergency status and the time remaining in the current state.
 
-Note! If the node is in emergency state USE_DEGRADED, or the emergency state is USE_DISABLED, the the value of'time' is insignificant.</description>
+Note! If the node is in emergency state USE_DEGRADED, or the emergency state is USE_DISABLED, the value of'time' is insignificant.</description>
             <noNotification/>
             <readOnly/>
             <dataType>
diff -Ndurp otp_src_27.2/system/doc/design_principles/statem.md otp_src_27.2-doc-the-the/system/doc/design_principles/statem.md
--- otp_src_27.2/system/doc/design_principles/statem.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/system/doc/design_principles/statem.md	2024-12-12 14:50:32.428203261 +0200
@@ -241,7 +241,7 @@ to the [`handle_event()`](`c:gen_statem:
 other arguments are the `EventType` and the event dependent `EventContent`,
 both described in section
 [_Event Types and Event Content_](#event-types-and-event-content),
-and the the last argument is the current server `Data`.
+and the last argument is the current server `Data`.
 
 [_State Enter Calls_](#state-enter-calls) (see that section)
 are also handled by the event handler and have slightly different arguments.
diff -Ndurp otp_src_27.2/system/doc/getting_started/seq_prog.md otp_src_27.2-doc-the-the/system/doc/getting_started/seq_prog.md
--- otp_src_27.2/system/doc/getting_started/seq_prog.md	2024-12-09 17:10:09.000000000 +0200
+++ otp_src_27.2-doc-the-the/system/doc/getting_started/seq_prog.md	2024-12-12 14:46:53.829467105 +0200
@@ -934,7 +934,7 @@ reverse([], Reversed_List) ->
 ```
 
 Consider how `Reversed_List` is built. It starts as [], then successively the
-heads are taken off of the list to be reversed and added to the the
+heads are taken off of the list to be reversed and added to the
 `Reversed_List`, as shown in the following:
 
 ```erlang
openSUSE Build Service is sponsored by