Skip to content

Commit e1d171e

Browse files
authored
Add inline License / Copyright to Erlang files (#14255)
1 parent d12286c commit e1d171e

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

47 files changed

+182
-41
lines changed

Makefile

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -226,12 +226,12 @@ docs_logger: compile ../ex_doc/bin/ex_doc
226226

227227
Docs.zip: docs
228228
rm -f Docs.zip
229-
zip -9 -r Docs.zip CHANGELOG.md doc NOTICE LICENSE README.md
229+
zip -9 -r Docs.zip CHANGELOG.md doc LICENSE README.md
230230
@ echo "Docs file created $(CURDIR)/Docs.zip"
231231

232232
Precompiled.zip: build_man compile
233233
rm -f Precompiled.zip
234-
zip -9 -r Precompiled.zip bin CHANGELOG.md lib/*/ebin lib/*/lib LICENSE Makefile man NOTICE README.md VERSION
234+
zip -9 -r Precompiled.zip bin CHANGELOG.md lib/*/ebin lib/*/lib LICENSE Makefile man README.md VERSION
235235
@ echo "Precompiled file created $(CURDIR)/Precompiled.zip"
236236

237237
#==> Test tasks

NOTICE

Lines changed: 0 additions & 38 deletions
This file was deleted.

README.md

Lines changed: 1 addition & 1 deletion

lib/elixir/scripts/windows_installer/update_system_path.erl

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,7 @@
11
#!/usr/bin/env escript
2+
%% SPDX-License-Identifier: Apache-2.0
3+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
4+
25
%%! -noinput
36

47
%% This file is used by the Elixir installer and uninstaller.

lib/elixir/src/elixir.app.src

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
{application, elixir,
26
[{description, "elixir"},
37
{vsn, '$will-be-replaced'},

lib/elixir/src/elixir.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Main entry point for Elixir functions. All of those functions are
26
%% private to the Elixir compiler and reserved to be used by Elixir only.
37
-module(elixir).

lib/elixir/src/elixir.hrl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-define(key(M, K), map_get(K, M)).
26
-define(ann(Meta), elixir_erl:get_ann(Meta)).
37
-define(line(Meta), elixir_utils:get_line(Meta)).

lib/elixir/src/elixir_aliases.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_aliases).
26
-export([inspect/1, concat/1, safe_concat/1, format_error/1,
37
ensure_loaded/3, expand/4, expand_or_concat/4, alias/6, require/5]).

lib/elixir/src/elixir_bitstring.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_bitstring).
26
-export([expand/5, format_error/1, validate_spec/2]).
37
-import(elixir_errors, [function_error/4]).

lib/elixir/src/elixir_bootstrap.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% An Erlang module that behaves like an Elixir module
26
%% used for bootstrapping.
37
-module(elixir_bootstrap).

lib/elixir/src/elixir_clauses.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Handle code related to args, guard and -> matching for case,
26
%% fn, receive and friends. try is handled in elixir_try.
37
-module(elixir_clauses).

lib/elixir/src/elixir_code_server.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_code_server).
26
-export([call/1, cast/1]).
37
-export([start_link/0, init/1, handle_call/3, handle_cast/2,

lib/elixir/src/elixir_compiler.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Elixir compiler front-end to the Erlang backend.
26
-module(elixir_compiler).
37
-export([string/3, quoted/3, bootstrap/0, file/2, compile/4]).

lib/elixir/src/elixir_config.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_config).
26
-compile({no_auto_import, [get/1]}).
37
-export([new/1, warn/2, serial/1]).

lib/elixir/src/elixir_def.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
% Holds the logic responsible for function definitions (def(p) and defmacro(p)).
26
-module(elixir_def).
37
-export([setup/1, reset_last/1, local_for/5, external_for/5,

lib/elixir/src/elixir_dispatch.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Helpers related to dispatching to imports and references.
26
%% This module access the information stored on the scope
37
%% by elixir_import and therefore assumes it is normalized (ordsets)

lib/elixir/src/elixir_env.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_env).
26
-include("elixir.hrl").
37
-export([

lib/elixir/src/elixir_erl.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Compiler backend to Erlang.
26

37
-module(elixir_erl).

lib/elixir/src/elixir_erl_clauses.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Handle code related to args, guard and -> matching for case,
26
%% fn, receive and friends. try is handled in elixir_erl_try.
37
-module(elixir_erl_clauses).

lib/elixir/src/elixir_erl_compiler.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_erl_compiler).
26
-export([spawn/1, noenv_forms/3, erl_to_core/2, env_compiler_options/0]).
37
-include("elixir.hrl").

lib/elixir/src/elixir_erl_for.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_erl_for).
26
-export([translate/3]).
37
-include("elixir.hrl").

lib/elixir/src/elixir_erl_pass.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Translate Elixir quoted expressions to Erlang Abstract Format.
26
-module(elixir_erl_pass).
37
-export([translate/3, translate_args/3, no_parens_remote/2, parens_map_field/2]).

lib/elixir/src/elixir_erl_try.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_erl_try).
26
-export([clauses/3]).
37
-include("elixir.hrl").

lib/elixir/src/elixir_erl_var.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Convenience functions used to manipulate scope and its variables.
26
-module(elixir_erl_var).
37
-export([

lib/elixir/src/elixir_errors.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% A bunch of helpers to help to deal with errors in Elixir source code.
26
%% This is not exposed in the Elixir language.
37
%%

lib/elixir/src/elixir_expand.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_expand).
26
-export([expand/3, expand_args/3, expand_arg/3, format_error/1]).
37
-import(elixir_errors, [file_error/4, module_error/4, function_error/4]).

lib/elixir/src/elixir_fn.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_fn).
26
-export([capture/4, expand/4, format_error/1]).
37
-import(elixir_errors, [file_error/4]).

lib/elixir/src/elixir_import.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Module responsible for handling imports and conflicts
26
%% between local functions and imports.
37
%% For imports dispatch, please check elixir_dispatch.

lib/elixir/src/elixir_interpolation.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
% Handle string and string-like interpolations.
26
-module(elixir_interpolation).
37
-export([extract/6, unescape_string/1, unescape_string/2,

lib/elixir/src/elixir_lexical.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Module responsible for tracking lexical information.
26
-module(elixir_lexical).
37
-export([run/3, with_file/3, trace/2, format_error/1]).

lib/elixir/src/elixir_map.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_map).
26
-export([expand_map/4, expand_struct/5, format_error/1, maybe_load_struct_info/5]).
37
-import(elixir_errors, [function_error/4, file_error/4, file_warn/4]).

lib/elixir/src/elixir_module.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_module).
26
-export([file/1, data_tables/1, is_open/1, mode/1, delete_definition_attributes/6,
37
compile/6, expand_callback/6, format_error/1, compiler_modules/0,

lib/elixir/src/elixir_overridable.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
% Holds the logic responsible for defining overridable functions and handling super.
26
-module(elixir_overridable).
37
-export([overridables_for/1, overridable_for/2,

lib/elixir/src/elixir_parser.yrl

Lines changed: 10 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,13 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
5+
%% REUSE-IgnoreStart
6+
Header "%% SPDX-License-Identifier: Apache-2.0"
7+
"%% SPDX-FileCopyrightText: 2021 The Elixir Team"
8+
"%% SPDX-FileCopyrightText: 2012 Plataformatec".
9+
%% REUSE-IgnoreEnd
10+
111
Nonterminals
212
grammar expr_list
313
expr container_expr block_expr access_expr

lib/elixir/src/elixir_quote.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_quote).
26
-export([escape/3, linify/3, linify_with_context_counter/3, build/7, quote/2, has_unquotes/1, fun_to_quoted/1]).
37
-export([dot/5, tail_list/3, list/2, validate_runtime/2, shallow_validate_ast/1]). %% Quote callbacks

lib/elixir/src/elixir_rewrite.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_rewrite).
26
-compile({inline, [inner_inline/4, inner_rewrite/5]}).
37
-compile(nowarn_shadow_vars).

lib/elixir/src/elixir_sup.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_sup).
26
-behaviour(supervisor).
37
-export([init/1, start_link/0]).

lib/elixir/src/elixir_tokenizer.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(elixir_tokenizer).
26
-include("elixir.hrl").
37
-include("elixir_tokenizer.hrl").

lib/elixir/src/elixir_tokenizer.hrl

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,6 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
14
%% Numbers
25
-define(is_hex(S), (?is_digit(S) orelse (S >= $A andalso S =< $F) orelse (S >= $a andalso S =< $f))).
36
-define(is_bin(S), (S >= $0 andalso S =< $1)).

lib/elixir/src/elixir_utils.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
%% Convenience functions used throughout elixir source code
26
%% for ast manipulation and querying.
37
-module(elixir_utils).

lib/elixir/src/iex.erl

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,6 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
14
-module(iex).
25
-export([start/0, start/2, shell/0, sync_remote/2]).
36

lib/elixir/test/erlang/atom_test.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(atom_test).
26
-export([kv/1]).
37
-include_lib("eunit/include/eunit.hrl").

lib/elixir/test/erlang/control_test.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(control_test).
26
-include_lib("eunit/include/eunit.hrl").
37

lib/elixir/test/erlang/function_test.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(function_test).
26
-include_lib("eunit/include/eunit.hrl").
37

lib/elixir/test/erlang/string_test.erl

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,7 @@
1+
%% SPDX-License-Identifier: Apache-2.0
2+
%% SPDX-FileCopyrightText: 2021 The Elixir Team
3+
%% SPDX-FileCopyrightText: 2012 Plataformatec
4+
15
-module(string_test).
26
-include("../../src/elixir.hrl").
37
-include_lib("eunit/include/eunit.hrl").

0 commit comments

Comments
 (0)