Skip to content

Commit 7f76973

Browse files
committed
Reformat and remote unnecessary statements
1 parent c020044 commit 7f76973

File tree

1 file changed

+13
-13
lines changed

1 file changed

+13
-13
lines changed

src/fpm_settings.f90

Lines changed: 13 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -106,7 +106,7 @@ subroutine get_global_settings(global_settings, error)
106106
call use_default_registry_settings(global_settings)
107107
end if
108108

109-
end subroutine get_global_settings
109+
end
110110

111111
!> Default registry settings are typically applied if the config file doesn't exist or no registry table was found in
112112
!> the global config file.
@@ -117,7 +117,7 @@ subroutine use_default_registry_settings(global_settings)
117117
global_settings%registry_settings%url = official_registry_base_url
118118
global_settings%registry_settings%cache_path = join_path(config_path(global_settings), &
119119
& 'dependencies')
120-
end subroutine use_default_registry_settings
120+
end
121121

122122
!> Read registry settings from the global config file.
123123
subroutine get_registry_settings(table, global_settings, error)
@@ -208,38 +208,38 @@ subroutine get_registry_settings(table, global_settings, error)
208208
if (allocated(error)) return
209209
end if
210210
else if (.not. allocated(path)) then
211-
global_settings%registry_settings%cache_path = join_path(config_path(global_settings), &
212-
& 'dependencies')
211+
global_settings%registry_settings%cache_path = join_path(config_path(global_settings), &
212+
& 'dependencies')
213213
end if
214-
end subroutine get_registry_settings
214+
end
215215

216216
!> True if the global config file is not at the default location.
217217
pure logical function has_custom_location(self)
218218
class(fpm_global_settings), intent(in) :: self
219219

220220
has_custom_location = allocated(self%path_to_config_folder) .and. allocated(self%config_file_name)
221-
if (.not.has_custom_location) return
222-
has_custom_location = len_trim(self%path_to_config_folder)>0 .and. len_trim(self%config_file_name)>0
223-
end function
221+
if (.not. has_custom_location) return
222+
has_custom_location = len_trim(self%path_to_config_folder) > 0 .and. len_trim(self%config_file_name) > 0
223+
end
224224

225225
!> The full path to the global config file.
226226
function full_path(self) result(result)
227227
class(fpm_global_settings), intent(in) :: self
228228
character(len=:), allocatable :: result
229229

230230
result = join_path(config_path(self), self%config_file_name)
231-
end function
231+
end
232232

233233
!> The path to the global config directory.
234234
function config_path(self)
235235
class(fpm_global_settings), intent(in) :: self
236236
character(len=:), allocatable :: config_path
237237

238238
if (allocated(self%path_to_config_folder)) then
239-
config_path = self%path_to_config_folder
239+
config_path = self%path_to_config_folder
240240
else
241-
config_path = ""
241+
config_path = ""
242242
end if
243-
end function config_path
243+
end
244244

245-
end module fpm_settings
245+
end

0 commit comments

Comments
 (0)