Skip to content

Commit

Permalink
Add inline License / Copyright to Erlang files (#14255)
Browse files Browse the repository at this point in the history
  • Loading branch information
maennchen authored Feb 5, 2025
1 parent d12286c commit e1d171e
Show file tree
Hide file tree
Showing 47 changed files with 182 additions and 41 deletions.
4 changes: 2 additions & 2 deletions Makefile
Original file line number Diff line number Diff line change
Expand Up @@ -226,12 +226,12 @@ docs_logger: compile ../ex_doc/bin/ex_doc

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

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

#==> Test tasks
Expand Down
38 changes: 0 additions & 38 deletions NOTICE

This file was deleted.

2 changes: 1 addition & 1 deletion README.md
Original file line number Diff line number Diff line change
Expand Up @@ -257,4 +257,4 @@ and `mix` under the `doc` directory. If you are planning to contribute documenta
Elixir source code is released under Apache License 2.0.
Check [NOTICE](NOTICE) and [LICENSE](LICENSE) files for more information.
Check [LICENSE](LICENSE) file for more information.
3 changes: 3 additions & 0 deletions lib/elixir/scripts/windows_installer/update_system_path.erl
Original file line number Diff line number Diff line change
@@ -1,4 +1,7 @@
#!/usr/bin/env escript
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team

%%! -noinput

%% This file is used by the Elixir installer and uninstaller.
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir.app.src
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

{application, elixir,
[{description, "elixir"},
{vsn, '$will-be-replaced'},
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Main entry point for Elixir functions. All of those functions are
%% private to the Elixir compiler and reserved to be used by Elixir only.
-module(elixir).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir.hrl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-define(key(M, K), map_get(K, M)).
-define(ann(Meta), elixir_erl:get_ann(Meta)).
-define(line(Meta), elixir_utils:get_line(Meta)).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_aliases.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_aliases).
-export([inspect/1, concat/1, safe_concat/1, format_error/1,
ensure_loaded/3, expand/4, expand_or_concat/4, alias/6, require/5]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_bitstring.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_bitstring).
-export([expand/5, format_error/1, validate_spec/2]).
-import(elixir_errors, [function_error/4]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_bootstrap.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% An Erlang module that behaves like an Elixir module
%% used for bootstrapping.
-module(elixir_bootstrap).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_clauses.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Handle code related to args, guard and -> matching for case,
%% fn, receive and friends. try is handled in elixir_try.
-module(elixir_clauses).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_code_server.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_code_server).
-export([call/1, cast/1]).
-export([start_link/0, init/1, handle_call/3, handle_cast/2,
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_compiler.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Elixir compiler front-end to the Erlang backend.
-module(elixir_compiler).
-export([string/3, quoted/3, bootstrap/0, file/2, compile/4]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_config.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_config).
-compile({no_auto_import, [get/1]}).
-export([new/1, warn/2, serial/1]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_def.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

% Holds the logic responsible for function definitions (def(p) and defmacro(p)).
-module(elixir_def).
-export([setup/1, reset_last/1, local_for/5, external_for/5,
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_dispatch.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Helpers related to dispatching to imports and references.
%% This module access the information stored on the scope
%% by elixir_import and therefore assumes it is normalized (ordsets)
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_env.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_env).
-include("elixir.hrl").
-export([
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Compiler backend to Erlang.

-module(elixir_erl).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_clauses.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Handle code related to args, guard and -> matching for case,
%% fn, receive and friends. try is handled in elixir_erl_try.
-module(elixir_erl_clauses).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_compiler.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_erl_compiler).
-export([spawn/1, noenv_forms/3, erl_to_core/2, env_compiler_options/0]).
-include("elixir.hrl").
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_for.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_erl_for).
-export([translate/3]).
-include("elixir.hrl").
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_pass.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Translate Elixir quoted expressions to Erlang Abstract Format.
-module(elixir_erl_pass).
-export([translate/3, translate_args/3, no_parens_remote/2, parens_map_field/2]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_try.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_erl_try).
-export([clauses/3]).
-include("elixir.hrl").
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_erl_var.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Convenience functions used to manipulate scope and its variables.
-module(elixir_erl_var).
-export([
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_errors.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% A bunch of helpers to help to deal with errors in Elixir source code.
%% This is not exposed in the Elixir language.
%%
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_expand.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_expand).
-export([expand/3, expand_args/3, expand_arg/3, format_error/1]).
-import(elixir_errors, [file_error/4, module_error/4, function_error/4]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_fn.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_fn).
-export([capture/4, expand/4, format_error/1]).
-import(elixir_errors, [file_error/4]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_import.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Module responsible for handling imports and conflicts
%% between local functions and imports.
%% For imports dispatch, please check elixir_dispatch.
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_interpolation.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

% Handle string and string-like interpolations.
-module(elixir_interpolation).
-export([extract/6, unescape_string/1, unescape_string/2,
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_lexical.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Module responsible for tracking lexical information.
-module(elixir_lexical).
-export([run/3, with_file/3, trace/2, format_error/1]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_map.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_map).
-export([expand_map/4, expand_struct/5, format_error/1, maybe_load_struct_info/5]).
-import(elixir_errors, [function_error/4, file_error/4, file_warn/4]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_module.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_module).
-export([file/1, data_tables/1, is_open/1, mode/1, delete_definition_attributes/6,
compile/6, expand_callback/6, format_error/1, compiler_modules/0,
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_overridable.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

% Holds the logic responsible for defining overridable functions and handling super.
-module(elixir_overridable).
-export([overridables_for/1, overridable_for/2,
Expand Down
10 changes: 10 additions & 0 deletions lib/elixir/src/elixir_parser.yrl
Original file line number Diff line number Diff line change
@@ -1,3 +1,13 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% REUSE-IgnoreStart
Header "%% SPDX-License-Identifier: Apache-2.0"
"%% SPDX-FileCopyrightText: 2021 The Elixir Team"
"%% SPDX-FileCopyrightText: 2012 Plataformatec".
%% REUSE-IgnoreEnd

Nonterminals
grammar expr_list
expr container_expr block_expr access_expr
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_quote.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_quote).
-export([escape/3, linify/3, linify_with_context_counter/3, build/7, quote/2, has_unquotes/1, fun_to_quoted/1]).
-export([dot/5, tail_list/3, list/2, validate_runtime/2, shallow_validate_ast/1]). %% Quote callbacks
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_rewrite.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_rewrite).
-compile({inline, [inner_inline/4, inner_rewrite/5]}).
-compile(nowarn_shadow_vars).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_sup.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_sup).
-behaviour(supervisor).
-export([init/1, start_link/0]).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_tokenizer.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(elixir_tokenizer).
-include("elixir.hrl").
-include("elixir_tokenizer.hrl").
Expand Down
3 changes: 3 additions & 0 deletions lib/elixir/src/elixir_tokenizer.hrl
Original file line number Diff line number Diff line change
@@ -1,3 +1,6 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team

%% Numbers
-define(is_hex(S), (?is_digit(S) orelse (S >= $A andalso S =< $F) orelse (S >= $a andalso S =< $f))).
-define(is_bin(S), (S >= $0 andalso S =< $1)).
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/src/elixir_utils.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

%% Convenience functions used throughout elixir source code
%% for ast manipulation and querying.
-module(elixir_utils).
Expand Down
3 changes: 3 additions & 0 deletions lib/elixir/src/iex.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,6 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team

-module(iex).
-export([start/0, start/2, shell/0, sync_remote/2]).

Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/test/erlang/atom_test.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(atom_test).
-export([kv/1]).
-include_lib("eunit/include/eunit.hrl").
Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/test/erlang/control_test.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(control_test).
-include_lib("eunit/include/eunit.hrl").

Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/test/erlang/function_test.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(function_test).
-include_lib("eunit/include/eunit.hrl").

Expand Down
4 changes: 4 additions & 0 deletions lib/elixir/test/erlang/string_test.erl
Original file line number Diff line number Diff line change
@@ -1,3 +1,7 @@
%% SPDX-License-Identifier: Apache-2.0
%% SPDX-FileCopyrightText: 2021 The Elixir Team
%% SPDX-FileCopyrightText: 2012 Plataformatec

-module(string_test).
-include("../../src/elixir.hrl").
-include_lib("eunit/include/eunit.hrl").
Expand Down
Loading

0 comments on commit e1d171e

Please sign in to comment.