Skip to content

Commit 185c695

Browse files
committed
replaced tab with spaces
1 parent e1b520c commit 185c695

File tree

1 file changed

+27
-27
lines changed

1 file changed

+27
-27
lines changed

doc/specs/stdlib_sorting.md

Lines changed: 27 additions & 27 deletions
Original file line numberDiff line numberDiff line change
@@ -464,40 +464,40 @@ Sorting a related rank one array:
464464
! Sort `a`, and also sort `b` to be reorderd the same way as `a`
465465
integer, intent(inout) :: a(:)
466466
integer(int32), intent(inout) :: b(:) ! The same size as a
467-
integer(int32), intent(out) :: work(:)
468-
integer(int_size), intent(out) :: index(:)
469-
integer(int_size), intent(out) :: iwork(:)
470-
! Find the indices to sort a
467+
integer(int32), intent(out) :: work(:)
468+
integer(int_size), intent(out) :: index(:)
469+
integer(int_size), intent(out) :: iwork(:)
470+
! Find the indices to sort a
471471
call sort_index(a, index(1:size(a)),&
472472
work(1:size(a)/2), iwork(1:size(a)/2))
473-
! Sort b based on the sorting of a
474-
b(:) = b( index(1:size(a)) )
475-
end subroutine sort_related_data
473+
! Sort b based on the sorting of a
474+
b(:) = b( index(1:size(a)) )
475+
end subroutine sort_related_data
476476
```
477477

478478
Sorting a rank 2 array based on the data in a column
479479

480480
```Fortran
481-
subroutine sort_related_data( array, column, work, index, iwork )
482-
! Reorder rows of `array` such that `array(:, column)` is sorted
483-
integer, intent(inout) :: array(:,:)
484-
integer(int32), intent(in) :: column
485-
integer(int32), intent(out) :: work(:)
486-
integer(int_size), intent(out) :: index(:)
487-
integer(int_size), intent(out) :: iwork(:)
488-
integer, allocatable :: dummy(:)
489-
integer :: i
490-
allocate(dummy(size(array, dim=1)))
491-
! Extract a column of `array`
492-
dummy(:) = array(:, column)
493-
! Find the indices to sort the column
494-
call sort_index(dummy, index(1:size(dummy)),&
495-
work(1:size(dummy)/2), iwork(1:size(dummy)/2))
496-
! Sort a based on the sorting of its column
497-
do i=1, size(array, dim=2)
498-
array(:, i) = array(index(1:size(array, dim=1)), i)
499-
end do
500-
end subroutine sort_related_data
481+
subroutine sort_related_data( array, column, work, index, iwork )
482+
! Reorder rows of `array` such that `array(:, column)` is sorted
483+
integer, intent(inout) :: array(:,:)
484+
integer(int32), intent(in) :: column
485+
integer(int32), intent(out) :: work(:)
486+
integer(int_size), intent(out) :: index(:)
487+
integer(int_size), intent(out) :: iwork(:)
488+
integer, allocatable :: dummy(:)
489+
integer :: i
490+
allocate(dummy(size(array, dim=1)))
491+
! Extract a column of `array`
492+
dummy(:) = array(:, column)
493+
! Find the indices to sort the column
494+
call sort_index(dummy, index(1:size(dummy)),&
495+
work(1:size(dummy)/2), iwork(1:size(dummy)/2))
496+
! Sort a based on the sorting of its column
497+
do i=1, size(array, dim=2)
498+
array(:, i) = array(index(1:size(array, dim=1)), i)
499+
end do
500+
end subroutine sort_related_data
501501
```
502502

503503
Sorting an array of a derived type based on the data in one component

0 commit comments

Comments
 (0)