@@ -28,7 +28,7 @@ module fpm_command_line
2828 OS_CYGWIN, OS_SOLARIS, OS_FREEBSD, OS_OPENBSD
2929use M_CLI2, only : set_args, lget, sget, unnamed, remaining, specified
3030use M_CLI2, only : get_subcommand, CLI_RESPONSE_FILE
31- use fpm_strings, only : lower, split, fnv_1a, to_fortran_name, is_fortran_name
31+ use fpm_strings, only : lower, split, to_fortran_name, is_fortran_name
3232use fpm_filesystem, only : basename, canon_path, which, run
3333use fpm_environment, only : get_command_arguments_quoted
3434use fpm_error, only : fpm_stop, error_t
@@ -262,7 +262,7 @@ subroutine get_command_line_settings(cmd_settings)
262262
263263 call check_build_vals()
264264
265- if ( size (unnamed) .gt. 1 )then
265+ if ( size (unnamed) > 1 )then
266266 names= unnamed(2 :)
267267 else
268268 names= [character (len= len (names)) :: ]
@@ -282,14 +282,14 @@ subroutine get_command_line_settings(cmd_settings)
282282 ! convert special string '..' to equivalent (shorter) '*'
283283 ! to allow for a string that does not require shift-key and quoting
284284 do i= 1 ,size (names)
285- if (names(i).eq. ' ..' )names(i)= ' *'
285+ if (names(i)== ' ..' )names(i)= ' *'
286286 enddo
287287
288288 c_compiler = sget(' c-compiler' )
289289 archiver = sget(' archiver' )
290290 allocate (fpm_run_settings :: cmd_settings)
291291 val_runner= sget(' runner' )
292- if (specified(' runner' ) .and. val_runner.eq. ' ' )val_runner= ' echo'
292+ if (specified(' runner' ) .and. val_runner== ' ' )val_runner= ' echo'
293293 cmd_settings= fpm_run_settings(&
294294 & args= remaining,&
295295 & profile= val_profile,&
@@ -361,7 +361,7 @@ subroutine get_command_line_settings(cmd_settings)
361361 call fpm_stop(2 ,' only one directory name allowed' )
362362 end select
363363 ! *! canon_path is not converting ".", etc.
364- if (name.eq. ' .' )then
364+ if (name== ' .' )then
365365 call get_current_directory(name, error)
366366 if (allocated (error)) then
367367 write (stderr, ' ("[Error]", 1x, a)' ) error% message
@@ -414,13 +414,13 @@ subroutine get_command_line_settings(cmd_settings)
414414
415415 case (' help' ,' manual' )
416416 call set_args(common_args, help_help,version_text)
417- if (size (unnamed).lt. 2 )then
418- if (unnamed(1 ).eq. ' help' )then
417+ if (size (unnamed)< 2 )then
418+ if (unnamed(1 )== ' help' )then
419419 unnamed= [' ' , ' fpm' ]
420420 else
421421 unnamed= manual
422422 endif
423- elseif (unnamed(2 ).eq. ' manual' )then
423+ elseif (unnamed(2 )== ' manual' )then
424424 unnamed= manual
425425 endif
426426 widest= 256
@@ -505,7 +505,7 @@ subroutine get_command_line_settings(cmd_settings)
505505
506506 call check_build_vals()
507507
508- if ( size (unnamed) .gt. 1 )then
508+ if ( size (unnamed) > 1 )then
509509 names= unnamed(2 :)
510510 else
511511 names= [character (len= len (names)) :: ]
@@ -519,14 +519,14 @@ subroutine get_command_line_settings(cmd_settings)
519519 ! convert special string '..' to equivalent (shorter) '*'
520520 ! to allow for a string that does not require shift-key and quoting
521521 do i= 1 ,size (names)
522- if (names(i).eq. ' ..' )names(i)= ' *'
522+ if (names(i)== ' ..' )names(i)= ' *'
523523 enddo
524524
525525 c_compiler = sget(' c-compiler' )
526526 archiver = sget(' archiver' )
527527 allocate (fpm_test_settings :: cmd_settings)
528528 val_runner= sget(' runner' )
529- if (specified(' runner' ) .and. val_runner.eq. ' ' )val_runner= ' echo'
529+ if (specified(' runner' ) .and. val_runner== ' ' )val_runner= ' echo'
530530 cmd_settings= fpm_test_settings(&
531531 & args= remaining, &
532532 & profile= val_profile, &
@@ -548,7 +548,7 @@ subroutine get_command_line_settings(cmd_settings)
548548 call set_args(common_args // ' --fetch-only F --clean F' , &
549549 help_update, version_text)
550550
551- if ( size (unnamed) .gt. 1 )then
551+ if ( size (unnamed) > 1 )then
552552 names= unnamed(2 :)
553553 else
554554 names= [character (len= len (names)) :: ]
@@ -575,7 +575,6 @@ subroutine get_command_line_settings(cmd_settings)
575575 case default
576576
577577 if (cmdarg.ne. ' ' .and. which(' fpm-' // cmdarg).ne. ' ' )then
578-
579578 call run(' fpm-' // trim (cmdarg)// ' ' // get_command_arguments_quoted(),.false. )
580579 else
581580 call set_args(' &
@@ -586,7 +585,7 @@ subroutine get_command_line_settings(cmd_settings)
586585 help_text= help_usage
587586 if (lget(' list' ))then
588587 help_text= help_list_dash
589- elseif (len_trim (cmdarg).eq. 0 )then
588+ elseif (len_trim (cmdarg)== 0 )then
590589 write (stdout,' (*(a))' )' Fortran Package Manager:'
591590 write (stdout,' (*(a))' )' '
592591 call printhelp(help_list_nodash)
@@ -611,7 +610,7 @@ subroutine check_build_vals()
611610 character (len= :), allocatable :: flags
612611
613612 val_compiler= sget(' compiler' )
614- if (val_compiler.eq. ' ' ) then
613+ if (val_compiler== ' ' ) then
615614 val_compiler= ' gfortran'
616615 endif
617616
@@ -627,7 +626,7 @@ subroutine printhelp(lines)
627626 integer :: iii,ii
628627 if (allocated (lines))then
629628 ii= size (lines)
630- if (ii .gt. 0 .and. len (lines).gt. 0 ) then
629+ if (ii > 0 .and. len (lines)> 0 ) then
631630 write (stdout,' (g0)' )(trim (lines(iii)), iii= 1 , ii)
632631 else
633632 write (stdout,' (a)' )' <WARNING> *printhelp* output requested is empty'
0 commit comments