bmp2seg Subroutine

private pure subroutine bmp2seg(self, segments)

Type Bound

bmp_t

Arguments

Type IntentOptional Attributes Name
class(bmp_t), intent(in) :: self
type(segment_t), intent(inout), allocatable :: segments(:)

Source Code

   pure subroutine bmp2seg(self, segments)
      use :: forgex_segment_m, only: segment_t
      implicit none
      class(bmp_t), intent(in) :: self
      type(segment_t), intent(inout), allocatable :: segments(:)

      type(segment_t), allocatable :: tmp(:)
      integer :: i, j, jb, je, k
      logical :: in_range

      in_range = .false.

      allocate(tmp(BMP_SIZE_BIT/2 + 1))

      k = 0
      do i = 0, BMP_SIZE-1
         do j = 0, bits_64-1
            if (btest(self%b(i), j)) then
               if (.not. in_range) then
                  jb = i*bits_64 + j
                  in_range = .true.
               end if
            else
               if (in_range) then
                  je = i*bits_64 +j -1
                  k = k + 1
                  tmp(k)%min = jb
                  tmp(k)%max = je
                  in_range = .false.
               end if
            end if
         end do
      end do

      if (in_range) then
         k = k + 1
         tmp(k)%min = jb
         tmp(k)%max = (i-1)*bits_64 + (bits_64-1)
      end if

      allocate(segments(k))
      segments(:) = tmp(1:k)

   end subroutine bmp2seg