Skip to content

Commit addc60e

Browse files
committed
Merge branch 'maint'
2 parents 915ef67 + 64746e1 commit addc60e

File tree

7 files changed

+55
-2
lines changed

7 files changed

+55
-2
lines changed

.ort/config/license-classifications.yml

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -117,3 +117,6 @@ categorizations:
117117
- id: "SGI-B-2.0"
118118
categories:
119119
- "review"
120+
- id: "LicenseRef-scancode-public-domain"
121+
categories:
122+
- "review"

erts/emulator/pcre/README.pcre_update.md

Lines changed: 5 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -21,6 +21,8 @@
2121
# %CopyrightEnd%
2222
-->
2323

24+
<!-- REUSE-IgnoreStart -->
25+
2426
# How to update the PCRE version used by Erlang
2527

2628
## The basic changes to the PCRE library
@@ -550,4 +552,6 @@ To avoid the work of a major upgrade, it is probably worth it to keep
550552
in pace with the changes to PCRE2. PCRE2 should probably be updated for
551553
each major release, instead of every five years. There seems to be an
552554
interest from the maintainers of PCRE2 to support yielding. Which
553-
would deprecates most of this file.
555+
would deprecates most of this file.
556+
557+
<!-- REUSE-IgnoreEnd -->

erts/emulator/test/nif_SUITE.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -2125,6 +2125,8 @@ make_new_atoms(Config) when is_list(Config) ->
21252125
0 = make_new_atom(TooLong4ByteUtf8AtomText, ?ERL_NIF_UTF8),
21262126
ok.
21272127

2128+
%% REUSE-IgnoreStart
2129+
21282130
%% Test enif_make_existing_atom_len
21292131
make_existing_atoms(Config) when is_list(Config) ->
21302132
ensure_lib_loaded(Config, 1),
@@ -2205,6 +2207,8 @@ make_existing_atoms(Config) when is_list(Config) ->
22052207
0 = make_existing_atom(TooLong4ByteUtf8AtomText, ?ERL_NIF_UTF8),
22062208
ok.
22072209

2210+
%% REUSE-IgnoreEnd
2211+
22082212
%% Test NIF maps handling.
22092213
maps(Config) when is_list(Config) ->
22102214
TmpMem = tmpmem(),

lib/compiler/src/cerl_inline.erl

Lines changed: 8 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -726,6 +726,8 @@ i_case_3(Vs, Env, E, S) ->
726726
i_clauses(Cs, Ctxt, Ren, Env, S) ->
727727
i_clauses([], Cs, Ctxt, Ren, Env, S).
728728

729+
%% REUSE-IgnoreStart
730+
729731
i_clauses(Es, Cs, Ctxt, Ren, Env, S) ->
730732
%% Create templates for the switch expressions.
731733
{Ts, {Vs, Env0}} = mapfoldl(fun (E, {Vs, Env_i}) ->
@@ -837,6 +839,8 @@ i_clause_head(C, Ts, Ren, Env, S) ->
837839
C1 = update_c_clause(C, Ps1, G1, B),
838840
{set_clause_extras(C1, Ren1, Env1, Size), revert_size(S, S5)}.
839841

842+
%% REUSE-IgnoreEnd
843+
840844
add_match_bindings(Bs, E) ->
841845
%% Don't waste time if the variables definitely cannot be used.
842846
%% (Most guards are simply `true'.)
@@ -849,13 +853,17 @@ add_match_bindings(Bs, E) ->
849853
c_let(Vs, c_values(Es), E)
850854
end.
851855

856+
%% REUSE-IgnoreStart
857+
852858
i_clause_body(C0, Ctxt, S) ->
853859
{C, Ren, Env, Size} = get_clause_extras(C0),
854860
S1 = count_size(Size, S),
855861
{B, S2} = i(clause_body(C), Ctxt, Ren, Env, S1),
856862
C1 = update_c_clause(C, clause_pats(C), clause_guard(C), B),
857863
{C1, S2}.
858864

865+
%% REUSE-IgnoreEnd
866+
859867
get_clause_extras(C) ->
860868
[{Ren, Env, Size} | As] = get_ann(C),
861869
{set_ann(C, As), Ren, Env, Size}.

lib/dialyzer/test/file_utils.erl

Lines changed: 24 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,25 @@
1+
%%
2+
%% %CopyrightBegin%
3+
%%
4+
%% SPDX-License-Identifier: Apache-2.0
5+
%%
6+
%% Copyright Ericsson AB 2000-2025. All Rights Reserved.
7+
%%
8+
%% Licensed under the Apache License, Version 2.0 (the "License");
9+
%% you may not use this file except in compliance with the License.
10+
%% You may obtain a copy of the License at
11+
%%
12+
%% http://www.apache.org/licenses/LICENSE-2.0
13+
%%
14+
%% Unless required by applicable law or agreed to in writing, software
15+
%% distributed under the License is distributed on an "AS IS" BASIS,
16+
%% WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
17+
%% See the License for the specific language governing permissions and
18+
%% limitations under the License.
19+
%%
20+
%% %CopyrightEnd%
21+
%%
22+
123
-module(file_utils).
224

325
-export([list_dir/3, file_type/1, diff/2]).
@@ -146,7 +168,7 @@ file_to_lines({file, File}) ->
146168
{error, _} = Error -> Error;
147169
Lines -> lists:reverse(Lines)
148170
end.
149-
171+
%% REUSE-IgnoreStart
150172
file_to_lines(File, Acc) ->
151173
case io:get_line(File, "") of
152174
{error, _}=Error -> Error;
@@ -161,3 +183,4 @@ file_to_lines(File, Acc) ->
161183
file_to_lines(File, [A|Acc])
162184
end
163185
end.
186+
%% REUSE-IgnoreEnd

lib/wx/api_gen/gen_util.erl

Lines changed: 7 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -230,6 +230,8 @@ erl_copyright() ->
230230
erl_wx_copyright() ->
231231
erl_copyright_template("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3").
232232

233+
%% REUSE-IgnoreStart
234+
233235
erl_copyright_template(License) ->
234236
StartYear = start_year(get(current_class)),
235237
{CurrentYear,_,_} = erlang:date(),
@@ -256,6 +258,8 @@ erl_copyright_template(License) ->
256258
append_license(License),
257259
w("%% %CopyrightEnd%~n",[]).
258260

261+
%% REUSE-IgnoreEnd
262+
259263
append_license("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3") ->
260264
w("%% For documentation, wxWindow Free Documentation License, Version 3 applies.~n",[]),
261265
w("%% wxWindows Free Documentation Licence, Version 3, as follows.~n",[]),
@@ -295,6 +299,7 @@ append_license("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3") ->
295299
append_license(_) ->
296300
ok.
297301

302+
%% REUSE-IgnoreStart
298303

299304
c_copyright() ->
300305
{CurrentYear,_,_} = erlang:date(),
@@ -320,6 +325,8 @@ c_copyright() ->
320325
w(" * %CopyrightEnd%~n",[]),
321326
w("*/~n",[]).
322327

328+
%% REUSE-IgnoreEnd
329+
323330
start_year("wxAuiManagerEvent") -> 2009;
324331
start_year("wxAuiNotebookEvent") -> 2009;
325332
start_year("wxChoicebook") -> 2009;

scripts/license-header.es

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -21,6 +21,8 @@
2121
%%
2222
%% %CopyrightEnd%
2323

24+
25+
%% REUSE-IgnoreStart
2426
-include_lib("kernel/include/file.hrl").
2527
-export([read_file_info/1, read_link_info/1, list_dir/1]).
2628

@@ -751,3 +753,5 @@ pmap_loop(Parent, MonitorRef, ParentMonitor) ->
751753
Parent ! {done, self(), MonitorRef, Res},
752754
pmap_loop(Parent, MonitorRef, ParentMonitor)
753755
end.
756+
757+
%% REUSE-IgnoreEnd

0 commit comments

Comments
 (0)