read lines into an array of TYPE(STRING_T) variables expanding tabs
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
integer, | intent(in) | :: | fh |
function read_lines_expanded(fh) result(lines)
integer, intent(in) :: fh
type(string_t), allocatable :: lines(:)
integer :: i
integer :: iostat
character(len=:),allocatable :: line_buffer_read
allocate(lines(number_of_rows(fh)))
do i = 1, size(lines)
call getline(fh, line_buffer_read, iostat)
lines(i)%s = dilate(line_buffer_read)
end do
end function read_lines_expanded