From 83d0c4ab6cf2e8487f8a89d72f9daf528accd49d Mon Sep 17 00:00:00 2001 From: minhqdao Date: Thu, 15 Jun 2023 14:45:18 +0700 Subject: [PATCH 01/14] Add verbose output to git_archive --- src/fpm/cmd/publish.f90 | 3 +-- src/fpm/git.f90 | 28 ++++++++++++++++++++++++---- 2 files changed, 25 insertions(+), 6 deletions(-) diff --git a/src/fpm/cmd/publish.f90 b/src/fpm/cmd/publish.f90 index c92cc5ff14..121316e7b4 100644 --- a/src/fpm/cmd/publish.f90 +++ b/src/fpm/cmd/publish.f90 @@ -65,7 +65,7 @@ subroutine cmd_publish(settings) end do tmp_file = get_temp_filename() - call git_archive('.', tmp_file, error) + call git_archive('.', tmp_file, 'HEAD', settings%verbose, error) if (allocated(error)) call fpm_stop(1, '*cmd_publish* Archive error: '//error%message) upload_data = [ & @@ -91,7 +91,6 @@ subroutine cmd_publish(settings) end if if (settings%verbose) then - print *, '' call print_upload_data(upload_data) print *, '' end if diff --git a/src/fpm/git.f90 b/src/fpm/git.f90 index ad86ca3f73..f8238b2075 100644 --- a/src/fpm/git.f90 +++ b/src/fpm/git.f90 @@ -308,31 +308,51 @@ subroutine info(self, unit, verbosity) end subroutine info !> Archive a folder using `git archive`. - subroutine git_archive(source, destination, error) + subroutine git_archive(source, destination, ref, verbose, error) !> Directory to archive. character(*), intent(in) :: source !> Destination of the archive. character(*), intent(in) :: destination + !> (Symbolic) Reference to be archived. + character(*), intent(in) :: ref + !> Whether to print verbose output. + logical, intent(in) :: verbose !> Error handling. type(error_t), allocatable, intent(out) :: error integer :: stat - character(len=:), allocatable :: cmd_output, archive_format + character(len=:), allocatable :: cmd_output, archive_format, cmd + + if (verbose) then + print *, '' + print *, 'Show git archive options:' + print *, ' + git archive -l' + end if call execute_and_read_output('git archive -l', cmd_output, error) if (allocated(error)) return + if (verbose) print *, ' ', cmd_output + if (index(cmd_output, 'tar.gz') /= 0) then archive_format = 'tar.gz' else call fatal_error(error, "Cannot find a suitable archive format for 'git archive'."); return end if - call execute_command_line('git archive HEAD --format='//archive_format//' -o '//destination, exitstat=stat) + cmd = 'git archive '//ref//' --format='//archive_format//' -o '//destination + + if (verbose) then + print *, '' + print *, 'Archive ', ref, ' using ', archive_format, ':' + print *, ' + ', cmd + print *, '' + end if + + call execute_command_line(cmd, exitstat=stat) if (stat /= 0) then call fatal_error(error, "Error packing '"//source//"'."); return end if end - end module fpm_git From c983e484ff059b6076d20c04709f93c276ff5de6 Mon Sep 17 00:00:00 2001 From: minhqdao Date: Thu, 15 Jun 2023 15:14:47 +0700 Subject: [PATCH 02/14] Add verbose printout to package upload --- src/fpm/cmd/publish.f90 | 2 +- src/fpm/downloader.f90 | 18 ++++++++++++++---- src/fpm/git.f90 | 2 +- 3 files changed, 16 insertions(+), 6 deletions(-) diff --git a/src/fpm/cmd/publish.f90 b/src/fpm/cmd/publish.f90 index 121316e7b4..43636c0e30 100644 --- a/src/fpm/cmd/publish.f90 +++ b/src/fpm/cmd/publish.f90 @@ -101,7 +101,7 @@ subroutine cmd_publish(settings) print *, 'Dry run successful. Generated tarball: ', tmp_file; return end if - call downloader%upload_form(official_registry_base_url//'/packages', upload_data, error) + call downloader%upload_form(official_registry_base_url//'/packages', upload_data, settings%verbose, error) call delete_file(tmp_file) if (allocated(error)) call fpm_stop(1, '*cmd_publish* Upload error: '//error%message) end diff --git a/src/fpm/downloader.f90 b/src/fpm/downloader.f90 index 7c5046df4e..b557d3ded6 100644 --- a/src/fpm/downloader.f90 +++ b/src/fpm/downloader.f90 @@ -76,23 +76,30 @@ subroutine get_file(url, tmp_pkg_file, error) end !> Perform an http post request with form data. - subroutine upload_form(endpoint, form_data, error) + subroutine upload_form(endpoint, form_data, verbose, error) + !> Endpoint to upload to. character(len=*), intent(in) :: endpoint + !> Form data to upload. type(string_t), intent(in) :: form_data(:) + !> Print additional information when true. + logical, intent(in) :: verbose + !> Error handling. type(error_t), allocatable, intent(out) :: error integer :: stat, i - character(len=:), allocatable :: form_data_str + character(len=:), allocatable :: form_data_str, cmd form_data_str = '' do i = 1, size(form_data) form_data_str = form_data_str//"-F '"//form_data(i)%s//"' " end do + cmd = 'curl -X POST -H "Content-Type: multipart/form-data" '//form_data_str//endpoint + if (which('curl') /= '') then print *, 'Uploading package ...' - call execute_command_line('curl -X POST -H "Content-Type: multipart/form-data" ' & - & //form_data_str//endpoint, exitstat=stat) + if (verbose) print *, ' + ', cmd + call execute_command_line(cmd, exitstat=stat) else call fatal_error(error, "'curl' not installed."); return end if @@ -104,8 +111,11 @@ subroutine upload_form(endpoint, form_data, error) !> Unpack a tarball to a destination. subroutine unpack(tmp_pkg_file, destination, error) + !> Path to tarball. character(*), intent(in) :: tmp_pkg_file + !> Destination to unpack to. character(*), intent(in) :: destination + !> Error handling. type(error_t), allocatable, intent(out) :: error integer :: stat diff --git a/src/fpm/git.f90 b/src/fpm/git.f90 index f8238b2075..b053427583 100644 --- a/src/fpm/git.f90 +++ b/src/fpm/git.f90 @@ -315,7 +315,7 @@ subroutine git_archive(source, destination, ref, verbose, error) character(*), intent(in) :: destination !> (Symbolic) Reference to be archived. character(*), intent(in) :: ref - !> Whether to print verbose output. + !> Print additional information when true. logical, intent(in) :: verbose !> Error handling. type(error_t), allocatable, intent(out) :: error From bac6f602a650ff7902a96c27aab8b071e832acda Mon Sep 17 00:00:00 2001 From: "John S. Urban" Date: Fri, 16 Jun 2023 16:25:08 -0400 Subject: [PATCH 03/14] Remove ENV_VARIABLE() as it duplicates the functionality of GET_ENV() The ENV_VARIABLE() procedure is performing functions already available in the GET_ENV() procedure. This changes the ENV_VARIABLE() calls to GET_ENV() calls to eliminate the duplication functionality. --- src/fpm_compiler.F90 | 1 - src/fpm_filesystem.F90 | 41 +++++++++-------------------------------- 2 files changed, 9 insertions(+), 33 deletions(-) diff --git a/src/fpm_compiler.F90 b/src/fpm_compiler.F90 index 2ba571cda5..02b99af135 100644 --- a/src/fpm_compiler.F90 +++ b/src/fpm_compiler.F90 @@ -28,7 +28,6 @@ module fpm_compiler use,intrinsic :: iso_fortran_env, only: stderr=>error_unit use fpm_environment, only: & - get_env, & get_os_type, & OS_LINUX, & OS_MACOS, & diff --git a/src/fpm_filesystem.F90 b/src/fpm_filesystem.F90 index d5637357d1..897063c6ff 100644 --- a/src/fpm_filesystem.F90 +++ b/src/fpm_filesystem.F90 @@ -14,7 +14,7 @@ module fpm_filesystem public :: basename, canon_path, dirname, is_dir, join_path, number_of_rows, list_files, get_local_prefix, & mkdir, exists, get_temp_filename, windows_path, unix_path, getline, delete_file, fileopen, fileclose, & filewrite, warnwrite, parent_dir, is_hidden_file, read_lines, read_lines_expanded, which, run, & - LINE_BUFFER_LEN, os_delete_dir, is_absolute_path, env_variable, get_home, execute_and_read_output, & + LINE_BUFFER_LEN, os_delete_dir, is_absolute_path, get_home, execute_and_read_output, & get_dos_path integer, parameter :: LINE_BUFFER_LEN = 32768 @@ -54,29 +54,6 @@ end function c_is_dir contains - -!> return value of environment variable -subroutine env_variable(var, name) - character(len=:), allocatable, intent(out) :: var - character(len=*), intent(in) :: name - integer :: length, stat - - call get_environment_variable(name, length=length, status=stat) - if (stat /= 0) return - - allocate(character(len=length) :: var) - - if (length > 0) then - call get_environment_variable(name, var, status=stat) - if (stat /= 0) then - deallocate(var) - return - end if - end if - -end subroutine env_variable - - !> Extract filename from path with/without suffix function basename(path,suffix) result (base) @@ -1017,15 +994,15 @@ function get_local_prefix(os) result(prefix) character(len=:), allocatable :: home if (os_is_unix(os)) then - call env_variable(home, "HOME") - if (allocated(home)) then + home=get_env('HOME','') + if (home /= '' ) then prefix = join_path(home, ".local") else prefix = default_prefix_unix end if else - call env_variable(home, "APPDATA") - if (allocated(home)) then + home=get_env('APPDATA','') + if (home /= '' ) then prefix = join_path(home, "local") else prefix = default_prefix_win @@ -1068,14 +1045,14 @@ subroutine get_home(home, error) type(error_t), allocatable, intent(out) :: error if (os_is_unix()) then - call env_variable(home, 'HOME') - if (.not. allocated(home)) then + home=get_env('HOME','') + if ( home == '' ) then call fatal_error(error, "Couldn't retrieve 'HOME' variable") return end if else - call env_variable(home, 'USERPROFILE') - if (.not. allocated(home)) then + home=get_env('USERPROFILE','') + if ( home == '' ) then call fatal_error(error, "Couldn't retrieve '%USERPROFILE%' variable") return end if From f0337abb1ca6f82689a5c101047306babf01da73 Mon Sep 17 00:00:00 2001 From: "John S. Urban" Date: Fri, 16 Jun 2023 16:42:28 -0400 Subject: [PATCH 04/14] change test_os.f90 accordingly --- test/fpm_test/test_os.f90 | 14 ++++++-------- 1 file changed, 6 insertions(+), 8 deletions(-) diff --git a/test/fpm_test/test_os.f90 b/test/fpm_test/test_os.f90 index 594aa937a5..71989167f5 100644 --- a/test/fpm_test/test_os.f90 +++ b/test/fpm_test/test_os.f90 @@ -1,7 +1,7 @@ module test_os use testsuite, only: new_unittest, unittest_t, error_t, test_failed - use fpm_filesystem, only: env_variable, join_path, mkdir, os_delete_dir, is_dir, get_local_prefix, get_home - use fpm_environment, only: os_is_unix + use fpm_filesystem, only: join_path, mkdir, os_delete_dir, is_dir, get_local_prefix, get_home + use fpm_environment, only: os_is_unix, get_env use fpm_os, only: get_absolute_path, get_absolute_path_by_cd, get_current_directory implicit none @@ -134,7 +134,7 @@ subroutine abs_path_nonexisting(error) subroutine abs_path_root(error) type(error_t), allocatable, intent(out) :: error - character(len=:), allocatable :: home_drive, home_path, result + character(len=:), allocatable :: home_path, result if (os_is_unix()) then call get_absolute_path('/', result, error) @@ -144,8 +144,7 @@ subroutine abs_path_root(error) call test_failed(error, "Result '"//result//"' doesn't equal input value: '/'"); return end if else - call env_variable(home_drive, 'HOMEDRIVE') - home_path = home_drive//'\' + home_path = get_env('HOMEDRIVE','') //'\' call get_absolute_path(home_path, result, error) if (allocated(error)) return @@ -177,7 +176,7 @@ subroutine abs_path_home(error) subroutine abs_path_cd_root(error) type(error_t), allocatable, intent(out) :: error - character(len=:), allocatable :: home_drive, home_path, current_dir_before, current_dir_after, result + character(len=:), allocatable :: home_path, current_dir_before, current_dir_after, result call get_current_directory(current_dir_before, error) if (allocated(error)) return @@ -189,8 +188,7 @@ subroutine abs_path_cd_root(error) call test_failed(error, "Result '"//result//"' doesn't equal input value: '/'"); return end if else - call env_variable(home_drive, 'HOMEDRIVE') - home_path = home_drive//'\' + home_path = get_env('HOMEDRIVE','')//'\' call get_absolute_path_by_cd(home_path, result, error) From f3d2c1366d8604738711085cc28d5469ec771bf5 Mon Sep 17 00:00:00 2001 From: minhqdao Date: Sat, 17 Jun 2023 22:30:00 +0700 Subject: [PATCH 05/14] Use run --- src/fpm/downloader.f90 | 12 +++++------- src/fpm/git.f90 | 26 +++++--------------------- src/fpm_filesystem.F90 | 20 ++++++++++++++------ 3 files changed, 24 insertions(+), 34 deletions(-) diff --git a/src/fpm/downloader.f90 b/src/fpm/downloader.f90 index b557d3ded6..c481324fd4 100644 --- a/src/fpm/downloader.f90 +++ b/src/fpm/downloader.f90 @@ -1,6 +1,6 @@ module fpm_downloader use fpm_error, only: error_t, fatal_error - use fpm_filesystem, only: which + use fpm_filesystem, only: which, run use fpm_versioning, only: version_t use jonquil, only: json_object, json_value, json_error, json_load, cast_to_object use fpm_strings, only: string_t @@ -81,25 +81,23 @@ subroutine upload_form(endpoint, form_data, verbose, error) character(len=*), intent(in) :: endpoint !> Form data to upload. type(string_t), intent(in) :: form_data(:) - !> Print additional information when true. + !> Print additional information if true. logical, intent(in) :: verbose !> Error handling. type(error_t), allocatable, intent(out) :: error integer :: stat, i - character(len=:), allocatable :: form_data_str, cmd + character(len=:), allocatable :: form_data_str form_data_str = '' do i = 1, size(form_data) form_data_str = form_data_str//"-F '"//form_data(i)%s//"' " end do - cmd = 'curl -X POST -H "Content-Type: multipart/form-data" '//form_data_str//endpoint - if (which('curl') /= '') then print *, 'Uploading package ...' - if (verbose) print *, ' + ', cmd - call execute_command_line(cmd, exitstat=stat) + call run('curl -X POST -H "Content-Type: multipart/form-data" '// & + & form_data_str//endpoint, exitstat=stat, verbose=verbose) else call fatal_error(error, "'curl' not installed."); return end if diff --git a/src/fpm/git.f90 b/src/fpm/git.f90 index b053427583..602c3c0439 100644 --- a/src/fpm/git.f90 +++ b/src/fpm/git.f90 @@ -1,7 +1,8 @@ !> Implementation for interacting with git repositories. module fpm_git use fpm_error, only: error_t, fatal_error - use fpm_filesystem, only : get_temp_filename, getline, join_path, execute_and_read_output + use fpm_filesystem, only : get_temp_filename, getline, join_path, execute_and_read_output, run + implicit none public :: git_target_t, git_target_default, git_target_branch, git_target_tag, git_target_revision, git_revision, & @@ -321,35 +322,18 @@ subroutine git_archive(source, destination, ref, verbose, error) type(error_t), allocatable, intent(out) :: error integer :: stat - character(len=:), allocatable :: cmd_output, archive_format, cmd - - if (verbose) then - print *, '' - print *, 'Show git archive options:' - print *, ' + git archive -l' - end if + character(len=:), allocatable :: cmd_output, archive_format - call execute_and_read_output('git archive -l', cmd_output, error) + call execute_and_read_output('git archive -l', cmd_output, error, verbose) if (allocated(error)) return - if (verbose) print *, ' ', cmd_output - if (index(cmd_output, 'tar.gz') /= 0) then archive_format = 'tar.gz' else call fatal_error(error, "Cannot find a suitable archive format for 'git archive'."); return end if - cmd = 'git archive '//ref//' --format='//archive_format//' -o '//destination - - if (verbose) then - print *, '' - print *, 'Archive ', ref, ' using ', archive_format, ':' - print *, ' + ', cmd - print *, '' - end if - - call execute_command_line(cmd, exitstat=stat) + call run('git archive '//ref//' --format='//archive_format//' -o '//destination, echo=verbose, exitstat=stat) if (stat /= 0) then call fatal_error(error, "Error packing '"//source//"'."); return end if diff --git a/src/fpm_filesystem.F90 b/src/fpm_filesystem.F90 index d5637357d1..7e77000a2f 100644 --- a/src/fpm_filesystem.F90 +++ b/src/fpm_filesystem.F90 @@ -1083,24 +1083,31 @@ subroutine get_home(home, error) end subroutine get_home !> Execute command line and return output as a string. - subroutine execute_and_read_output(cmd, output, error, exitstat) + subroutine execute_and_read_output(cmd, output, error, verbose) !> Command to execute. character(len=*), intent(in) :: cmd !> Command line output. character(len=:), allocatable, intent(out) :: output !> Error to handle. type(error_t), allocatable, intent(out) :: error - !> Can optionally used for error handling. - integer, intent(out), optional :: exitstat + !> Print additional information if true. + logical, intent(in), optional :: verbose - integer :: cmdstat, unit, stat = 0 + integer :: exitstat, unit, stat = 0 character(len=:), allocatable :: cmdmsg, tmp_file character(len=1000) :: output_line + logical :: is_verbose + + if (present(verbose)) then + is_verbose = verbose + else + is_verbose = .false. + end if tmp_file = get_temp_filename() - call execute_command_line(cmd//' > '//tmp_file, exitstat=exitstat, cmdstat=cmdstat) - if (cmdstat /= 0) call fatal_error(error, '*run*: '//"Command failed: '"//cmd//"'. Message: '"//trim(cmdmsg)//"'.") + call run(cmd//' > '//tmp_file, exitstat=exitstat, echo=is_verbose) + if (exitstat /= 0) call fatal_error(error, '*run*: '//"Command failed: '"//cmd//"'. Message: '"//trim(cmdmsg)//"'.") open(newunit=unit, file=tmp_file, action='read', status='old') output = '' @@ -1109,6 +1116,7 @@ subroutine execute_and_read_output(cmd, output, error, exitstat) if (stat /= 0) exit output = output//trim(output_line)//' ' end do + if (is_verbose) print *, output close(unit, status='delete') end From 21a71de61c6d4ceb2c4f16749839662a63889cdf Mon Sep 17 00:00:00 2001 From: minhqdao Date: Sat, 17 Jun 2023 22:55:14 +0700 Subject: [PATCH 06/14] Do not initialize stat --- src/fpm_filesystem.F90 | 4 ++-- 1 file changed, 2 insertions(+), 2 deletions(-) diff --git a/src/fpm_filesystem.F90 b/src/fpm_filesystem.F90 index 45d748831d..b493b2e886 100644 --- a/src/fpm_filesystem.F90 +++ b/src/fpm_filesystem.F90 @@ -1152,7 +1152,7 @@ subroutine execute_and_read_output(cmd, output, error, verbose) !> Print additional information if true. logical, intent(in), optional :: verbose - integer :: exitstat, unit, stat = 0 + integer :: exitstat, unit, stat character(len=:), allocatable :: cmdmsg, tmp_file, output_line logical :: is_verbose @@ -1175,7 +1175,7 @@ subroutine execute_and_read_output(cmd, output, error, verbose) output = output//output_line//' ' end do if (is_verbose) print *, output - close(unit, status='delete', iostat=stat) + close(unit, status='delete') end !> Ensure a windows path is converted to an 8.3 DOS path if it contains spaces From 1b38b982c2a586eedc96b05f3e1cbe0e5ddbeae1 Mon Sep 17 00:00:00 2001 From: minhqdao Date: Sun, 18 Jun 2023 09:45:57 +0700 Subject: [PATCH 07/14] Change verbose to echo --- src/fpm/downloader.f90 | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/src/fpm/downloader.f90 b/src/fpm/downloader.f90 index c481324fd4..39a3314ccf 100644 --- a/src/fpm/downloader.f90 +++ b/src/fpm/downloader.f90 @@ -97,7 +97,7 @@ subroutine upload_form(endpoint, form_data, verbose, error) if (which('curl') /= '') then print *, 'Uploading package ...' call run('curl -X POST -H "Content-Type: multipart/form-data" '// & - & form_data_str//endpoint, exitstat=stat, verbose=verbose) + & form_data_str//endpoint, exitstat=stat, echo=verbose) else call fatal_error(error, "'curl' not installed."); return end if From 953c57665d599d129564460ce354d29bfbe4b390 Mon Sep 17 00:00:00 2001 From: minhqdao Date: Sun, 18 Jun 2023 10:01:07 +0700 Subject: [PATCH 08/14] Nit --- src/fpm/git.f90 | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/src/fpm/git.f90 b/src/fpm/git.f90 index 602c3c0439..c007743a90 100644 --- a/src/fpm/git.f90 +++ b/src/fpm/git.f90 @@ -316,7 +316,7 @@ subroutine git_archive(source, destination, ref, verbose, error) character(*), intent(in) :: destination !> (Symbolic) Reference to be archived. character(*), intent(in) :: ref - !> Print additional information when true. + !> Print additional information if true. logical, intent(in) :: verbose !> Error handling. type(error_t), allocatable, intent(out) :: error From d69203ebca55688c57ed138d66c34d03a4f5adcd Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Sun, 18 Jun 2023 14:51:25 +0200 Subject: [PATCH 09/14] use clang as the brew compiler --- .github/workflows/meta.yml | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/.github/workflows/meta.yml b/.github/workflows/meta.yml index 93075fd812..0423fe90f8 100644 --- a/.github/workflows/meta.yml +++ b/.github/workflows/meta.yml @@ -198,7 +198,7 @@ jobs: - name: (macOS) Install homebrew OpenMPI if: contains(matrix.mpi,'openmpi') && contains(matrix.os,'macos') run: | - brew install --cc=gcc-${{ env.GCC_V }} openmpi + brew install openmpi #--cc=gcc-${{ env.GCC_V }} openmpi # Phase 1: Bootstrap fpm with existing version - name: Install fpm From e279d452405440e4bc4b1d920777d9a4f1606436 Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Sun, 18 Jun 2023 14:52:25 +0200 Subject: [PATCH 10/14] fix comment --- src/fpm_meta.f90 | 4 ++++ 1 file changed, 4 insertions(+) diff --git a/src/fpm_meta.f90 b/src/fpm_meta.f90 index c8fd4171de..c610e5ad4f 100644 --- a/src/fpm_meta.f90 +++ b/src/fpm_meta.f90 @@ -8,6 +8,10 @@ !>### Available core libraries !> !> - OpenMP +!> - MPI +!> - fortran-lang stdlib +!> - fortran-lang minpack +!> !> !> @note Core libraries are enabled in the [build] section of the fpm.toml manifest !> From 702ee64655f5b1bf629857bbfbd7a5bfb2e0d0f7 Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Sun, 18 Jun 2023 22:07:06 +0200 Subject: [PATCH 11/14] try homebrew-no-auto-update --- .github/workflows/meta.yml | 2 +- src/fpm_meta.f90 | 2 +- 2 files changed, 2 insertions(+), 2 deletions(-) diff --git a/.github/workflows/meta.yml b/.github/workflows/meta.yml index 0423fe90f8..6370d6dc11 100644 --- a/.github/workflows/meta.yml +++ b/.github/workflows/meta.yml @@ -15,7 +15,7 @@ on: env: CI: "ON" # We can detect this in the build system and other vendors implement it HOMEBREW_NO_ANALYTICS: "ON" # Make Homebrew installation a little quicker - HOMEBREW_NO_AUTO_UPDATE: "ON" + HOMEBREW_NO_AUTO_UPDATE: 1 HOMEBREW_NO_BOTTLE_SOURCE_FALLBACK: "ON" HOMEBREW_NO_GITHUB_API: "ON" HOMEBREW_NO_INSTALL_CLEANUP: "ON" diff --git a/src/fpm_meta.f90 b/src/fpm_meta.f90 index c610e5ad4f..432d17495f 100644 --- a/src/fpm_meta.f90 +++ b/src/fpm_meta.f90 @@ -3,7 +3,7 @@ !> This is a wrapper data type that encapsulate all pre-processing information !> (compiler flags, linker libraries, etc.) required to correctly enable a package !> to use a core library. -!> +!> !> !>### Available core libraries !> From 2a4dba56c5c0727ea81cceecb7ba22a46fd87007 Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Sun, 18 Jun 2023 22:12:47 +0200 Subject: [PATCH 12/14] make all homebrew variables `1` instead of `"ON"` --- .github/workflows/meta.yml | 8 ++++---- src/fpm_meta.f90 | 2 +- 2 files changed, 5 insertions(+), 5 deletions(-) diff --git a/.github/workflows/meta.yml b/.github/workflows/meta.yml index 6370d6dc11..8bf64314d6 100644 --- a/.github/workflows/meta.yml +++ b/.github/workflows/meta.yml @@ -14,11 +14,11 @@ on: env: CI: "ON" # We can detect this in the build system and other vendors implement it - HOMEBREW_NO_ANALYTICS: "ON" # Make Homebrew installation a little quicker + HOMEBREW_NO_ANALYTICS: 1 # Make Homebrew installation a little quicker HOMEBREW_NO_AUTO_UPDATE: 1 - HOMEBREW_NO_BOTTLE_SOURCE_FALLBACK: "ON" - HOMEBREW_NO_GITHUB_API: "ON" - HOMEBREW_NO_INSTALL_CLEANUP: "ON" + HOMEBREW_NO_BOTTLE_SOURCE_FALLBACK: 1 + HOMEBREW_NO_GITHUB_API: 1 + HOMEBREW_NO_INSTALL_CLEANUP: 1 jobs: diff --git a/src/fpm_meta.f90 b/src/fpm_meta.f90 index 432d17495f..92b755dd6a 100644 --- a/src/fpm_meta.f90 +++ b/src/fpm_meta.f90 @@ -5,7 +5,7 @@ !> to use a core library. !> !> -!>### Available core libraries +!>### Available core libraries !> !> - OpenMP !> - MPI From be67bc619f7e206f83e926ce96509fd5789b2fb5 Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Sun, 18 Jun 2023 22:18:11 +0200 Subject: [PATCH 13/14] do not check installed dependents --- .github/workflows/meta.yml | 1 + src/fpm_meta.f90 | 2 +- 2 files changed, 2 insertions(+), 1 deletion(-) diff --git a/.github/workflows/meta.yml b/.github/workflows/meta.yml index 8bf64314d6..86b5215c53 100644 --- a/.github/workflows/meta.yml +++ b/.github/workflows/meta.yml @@ -19,6 +19,7 @@ env: HOMEBREW_NO_BOTTLE_SOURCE_FALLBACK: 1 HOMEBREW_NO_GITHUB_API: 1 HOMEBREW_NO_INSTALL_CLEANUP: 1 + HOMEBREW_NO_INSTALLED_DEPENDENTS_CHECK: 1 jobs: diff --git a/src/fpm_meta.f90 b/src/fpm_meta.f90 index 92b755dd6a..f86e3a6b27 100644 --- a/src/fpm_meta.f90 +++ b/src/fpm_meta.f90 @@ -3,7 +3,7 @@ !> This is a wrapper data type that encapsulate all pre-processing information !> (compiler flags, linker libraries, etc.) required to correctly enable a package !> to use a core library. -!> +!> !> !>### Available core libraries !> From bf88610a82d0ec44e6ee89c7c7f7b53b0e3e48db Mon Sep 17 00:00:00 2001 From: Federico Perini Date: Mon, 19 Jun 2023 08:26:17 +0200 Subject: [PATCH 14/14] fpm_filesystem.F90: fix broken resolve conflicts --- src/fpm_filesystem.F90 | 3 +-- 1 file changed, 1 insertion(+), 2 deletions(-) diff --git a/src/fpm_filesystem.F90 b/src/fpm_filesystem.F90 index 9d2d8f896e..81c5628e40 100644 --- a/src/fpm_filesystem.F90 +++ b/src/fpm_filesystem.F90 @@ -14,8 +14,7 @@ module fpm_filesystem public :: basename, canon_path, dirname, is_dir, join_path, number_of_rows, list_files, get_local_prefix, & mkdir, exists, get_temp_filename, windows_path, unix_path, getline, delete_file, fileopen, fileclose, & filewrite, warnwrite, parent_dir, is_hidden_file, read_lines, read_lines_expanded, which, run, & - LINE_BUFFER_LEN, os_delete_dir, is_absolute_path, get_home, execute_and_read_output, & - get_dos_path + os_delete_dir, is_absolute_path, get_home, execute_and_read_output, get_dos_path #ifndef FPM_BOOTSTRAP interface