Skip to content
Open
Show file tree
Hide file tree
Changes from all commits
Commits
File filter

Filter by extension

Filter by extension

Conversations
Failed to load comments.
Loading
Jump to
Jump to file
Failed to load files.
Loading
Diff view
Diff view
3 changes: 3 additions & 0 deletions .ort/config/license-classifications.yml
Original file line number Diff line number Diff line change
Expand Up @@ -117,3 +117,6 @@ categorizations:
- id: "SGI-B-2.0"
categories:
- "review"
- id: "LicenseRef-scancode-public-domain"
categories:
- "review"
6 changes: 5 additions & 1 deletion erts/emulator/pcre/README.pcre_update.md
Original file line number Diff line number Diff line change
Expand Up @@ -21,6 +21,8 @@
# %CopyrightEnd%
-->

<!-- REUSE-IgnoreStart -->

# How to update the PCRE version used by Erlang

## The basic changes to the PCRE library
Expand Down Expand Up @@ -550,4 +552,6 @@ To avoid the work of a major upgrade, it is probably worth it to keep
in pace with the changes to PCRE2. PCRE2 should probably be updated for
each major release, instead of every five years. There seems to be an
interest from the maintainers of PCRE2 to support yielding. Which
would deprecates most of this file.
would deprecates most of this file.

<!-- REUSE-IgnoreEnd -->
4 changes: 4 additions & 0 deletions erts/emulator/test/nif_SUITE.erl
Original file line number Diff line number Diff line change
Expand Up @@ -2125,6 +2125,8 @@ make_new_atoms(Config) when is_list(Config) ->
0 = make_new_atom(TooLong4ByteUtf8AtomText, ?ERL_NIF_UTF8),
ok.

%% REUSE-IgnoreStart

%% Test enif_make_existing_atom_len
make_existing_atoms(Config) when is_list(Config) ->
ensure_lib_loaded(Config, 1),
Expand Down Expand Up @@ -2205,6 +2207,8 @@ make_existing_atoms(Config) when is_list(Config) ->
0 = make_existing_atom(TooLong4ByteUtf8AtomText, ?ERL_NIF_UTF8),
ok.

%% REUSE-IgnoreEnd

%% Test NIF maps handling.
maps(Config) when is_list(Config) ->
TmpMem = tmpmem(),
Expand Down
8 changes: 8 additions & 0 deletions lib/compiler/src/cerl_inline.erl
Original file line number Diff line number Diff line change
Expand Up @@ -726,6 +726,8 @@ i_case_3(Vs, Env, E, S) ->
i_clauses(Cs, Ctxt, Ren, Env, S) ->
i_clauses([], Cs, Ctxt, Ren, Env, S).

%% REUSE-IgnoreStart

i_clauses(Es, Cs, Ctxt, Ren, Env, S) ->
%% Create templates for the switch expressions.
{Ts, {Vs, Env0}} = mapfoldl(fun (E, {Vs, Env_i}) ->
Expand Down Expand Up @@ -837,6 +839,8 @@ i_clause_head(C, Ts, Ren, Env, S) ->
C1 = update_c_clause(C, Ps1, G1, B),
{set_clause_extras(C1, Ren1, Env1, Size), revert_size(S, S5)}.

%% REUSE-IgnoreEnd

add_match_bindings(Bs, E) ->
%% Don't waste time if the variables definitely cannot be used.
%% (Most guards are simply `true'.)
Expand All @@ -849,13 +853,17 @@ add_match_bindings(Bs, E) ->
c_let(Vs, c_values(Es), E)
end.

%% REUSE-IgnoreStart

i_clause_body(C0, Ctxt, S) ->
{C, Ren, Env, Size} = get_clause_extras(C0),
S1 = count_size(Size, S),
{B, S2} = i(clause_body(C), Ctxt, Ren, Env, S1),
C1 = update_c_clause(C, clause_pats(C), clause_guard(C), B),
{C1, S2}.

%% REUSE-IgnoreEnd

get_clause_extras(C) ->
[{Ren, Env, Size} | As] = get_ann(C),
{set_ann(C, As), Ren, Env, Size}.
Expand Down
25 changes: 24 additions & 1 deletion lib/dialyzer/test/file_utils.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,25 @@
%%
%% %CopyrightBegin%
%%
%% SPDX-License-Identifier: Apache-2.0
%%
%% Copyright Ericsson AB 2000-2025. All Rights Reserved.
%%
%% Licensed under the Apache License, Version 2.0 (the "License");
%% you may not use this file except in compliance with the License.
%% You may obtain a copy of the License at
%%
%% http://www.apache.org/licenses/LICENSE-2.0
%%
%% Unless required by applicable law or agreed to in writing, software
%% distributed under the License is distributed on an "AS IS" BASIS,
%% WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
%% See the License for the specific language governing permissions and
%% limitations under the License.
%%
%% %CopyrightEnd%
%%

-module(file_utils).

-export([list_dir/3, file_type/1, diff/2]).
Expand Down Expand Up @@ -146,7 +168,7 @@ file_to_lines({file, File}) ->
{error, _} = Error -> Error;
Lines -> lists:reverse(Lines)
end.

%% REUSE-IgnoreStart
file_to_lines(File, Acc) ->
case io:get_line(File, "") of
{error, _}=Error -> Error;
Expand All @@ -161,3 +183,4 @@ file_to_lines(File, Acc) ->
file_to_lines(File, [A|Acc])
end
end.
%% REUSE-IgnoreEnd
7 changes: 7 additions & 0 deletions lib/wx/api_gen/gen_util.erl
Original file line number Diff line number Diff line change
Expand Up @@ -230,6 +230,8 @@ erl_copyright() ->
erl_wx_copyright() ->
erl_copyright_template("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3").

%% REUSE-IgnoreStart

erl_copyright_template(License) ->
StartYear = start_year(get(current_class)),
{CurrentYear,_,_} = erlang:date(),
Expand All @@ -256,6 +258,8 @@ erl_copyright_template(License) ->
append_license(License),
w("%% %CopyrightEnd%~n",[]).

%% REUSE-IgnoreEnd

append_license("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3") ->
w("%% For documentation, wxWindow Free Documentation License, Version 3 applies.~n",[]),
w("%% wxWindows Free Documentation Licence, Version 3, as follows.~n",[]),
Expand Down Expand Up @@ -295,6 +299,7 @@ append_license("Apache-2.0 AND LicenseRef-scancode-wxwindows-free-doc-3") ->
append_license(_) ->
ok.

%% REUSE-IgnoreStart

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

%% REUSE-IgnoreEnd

start_year("wxAuiManagerEvent") -> 2009;
start_year("wxAuiNotebookEvent") -> 2009;
start_year("wxChoicebook") -> 2009;
Expand Down
4 changes: 4 additions & 0 deletions scripts/license-header.es
Original file line number Diff line number Diff line change
Expand Up @@ -21,6 +21,8 @@
%%
%% %CopyrightEnd%


%% REUSE-IgnoreStart
-include_lib("kernel/include/file.hrl").
-export([read_file_info/1, read_link_info/1, list_dir/1]).

Expand Down Expand Up @@ -751,3 +753,5 @@ pmap_loop(Parent, MonitorRef, ParentMonitor) ->
Parent ! {done, self(), MonitorRef, Res},
pmap_loop(Parent, MonitorRef, ParentMonitor)
end.

%% REUSE-IgnoreEnd