Skip to content

Commit 712d5ed

Browse files
committed
space
1 parent bc9fa94 commit 712d5ed

File tree

2 files changed

+13
-13
lines changed

2 files changed

+13
-13
lines changed

fpm/src/fpm/cmd/new.f90

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@ subroutine cmd_new(settings)
7171
character(len=:,kind=tfc),allocatable :: bname ! baeename of NAME
7272
character(len=:,kind=tfc),allocatable :: tomlfile(:)
7373
character(len=:,kind=tfc),allocatable :: littlefile(:)
74-
74+
7575
!> TOP DIRECTORY NAME PROCESSING
7676
!> see if requested new directory already exists and process appropriately
7777
if(exists(settings%name) .and. .not.settings%backfill )then

fpm/src/fpm_source_parsing.f90

Lines changed: 12 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -6,8 +6,8 @@
66
!>
77
!> Both functions additionally calculate and store a file digest (hash) which
88
!> is used by the backend ([[fpm_backend]]) to skip compilation of unmodified sources.
9-
!>
10-
!> Both functions return an instance of the [[srcfile_t]] type.
9+
!>
10+
!> Both functions return an instance of the [[srcfile_t]] type.
1111
!>
1212
!> For more information, please read the documentation for each function:
1313
!>
@@ -38,7 +38,7 @@ module fpm_source_parsing
3838
contains
3939

4040
!> Parsing of free-form fortran source files
41-
!>
41+
!>
4242
!> The following statements are recognised and parsed:
4343
!>
4444
!> - `Module`/`submodule`/`program` declaration
@@ -171,7 +171,7 @@ function parse_f_source(f_filename,error) result(f_source)
171171
if (index(adjustl(file_lines(i)%s(ic+7:)),'"') == 1 .or. &
172172
index(adjustl(file_lines(i)%s(ic+7:)),"'") == 1 ) then
173173

174-
174+
175175
n_include = n_include + 1
176176

177177
if (pass == 2) then
@@ -264,7 +264,7 @@ function parse_f_source(f_filename,error) result(f_source)
264264
if (index(temp_string,':') > 0) then
265265

266266
temp_string = temp_string(index(temp_string,':')+1:)
267-
267+
268268
end if
269269

270270
if (.not.validate_name(temp_string)) then
@@ -288,7 +288,7 @@ function parse_f_source(f_filename,error) result(f_source)
288288

289289
temp_string = lower(split_n(file_lines(i)%s,n=2,delims=' ',stat=stat))
290290
if (stat == 0) then
291-
291+
292292
if (scan(temp_string,'=(')>0 ) then
293293
! Ignore:
294294
! program =*
@@ -343,7 +343,7 @@ function validate_name(name) result(valid)
343343
(name(i:i) >= '0' .and. name(i:i) <= '9').or. &
344344
(lower(name(i:i)) >= 'a' .and. lower(name(i:i)) <= 'z').or. &
345345
name(i:i) == '_') ) then
346-
346+
347347
valid = .false.
348348
return
349349
end if
@@ -359,7 +359,7 @@ end function parse_f_source
359359

360360

361361
!> Parsing of c source files
362-
!>
362+
!>
363363
!> The following statements are recognised and parsed:
364364
!>
365365
!> - `#include` preprocessor statement
@@ -396,17 +396,17 @@ function parse_c_source(c_filename,error) result(c_source)
396396
c_source%unit_type = FPM_UNIT_UNKNOWN
397397
return
398398
end if
399-
399+
400400
c_source%digest = fnv_1a(file_lines)
401-
401+
402402
do pass = 1,2
403403
n_include = 0
404404
file_loop: do i=1,size(file_lines)
405405

406406
! Process 'INCLUDE' statements
407407
if (index(adjustl(lower(file_lines(i)%s)),'#include') == 1 .and. &
408408
index(file_lines(i)%s,'"') > 0) then
409-
409+
410410
n_include = n_include + 1
411411

412412
if (pass == 2) then
@@ -440,7 +440,7 @@ end function parse_c_source
440440
!> n=0 will return the last item
441441
!> n=-1 will return the penultimate item etc.
442442
!>
443-
!> stat = 1 on return if the index
443+
!> stat = 1 on return if the index
444444
!> is not found
445445
!>
446446
function split_n(string,delims,n,stat) result(substring)

0 commit comments

Comments
 (0)