Asking Grok 3 to do something related,
Write a function that has an input argument of a 1D array of reals and a format string such as “(f0.6)” and returns a deferred-length character array of sufficient LEN to hold the real numbers converted to strings.
first gave a function where it used only the first element of the array to determine the LEN, with Grok mentioning this limitation. Asked to use a LEN sufficient to hold all the numbers converted to character variables, Grok gave
MODULE string_conversion
IMPLICIT NONE
PRIVATE
PUBLIC :: real_to_string_array ! Expose only the function to users
CONTAINS
FUNCTION real_to_string_array(real_array, fmt) RESULT(str_array)
REAL, INTENT(IN) :: real_array(:) ! Input 1D array of reals
CHARACTER(LEN=*), INTENT(IN) :: fmt ! Format string, e.g., "(f0.6)"
CHARACTER(LEN=:), ALLOCATABLE :: str_array(:) ! Deferred-length character array output
INTEGER :: i, n, len_str, max_len
CHARACTER(LEN=256) :: temp_str ! Temporary string for formatting
! Get the size of the input array
n = SIZE(real_array)
! Determine the maximum length needed by checking all elements
max_len = 0
DO i = 1, n
WRITE(temp_str, fmt) real_array(i) ! Format each real number
len_str = LEN_TRIM(ADJUSTL(temp_str)) ! Get trimmed length of formatted string
IF (len_str > max_len) max_len = len_str ! Update max length if current is larger
END DO
! Allocate the deferred-length character array with the maximum length
ALLOCATE(CHARACTER(LEN=max_len) :: str_array(n))
! Convert each real number to a string using the provided format
DO i = 1, n
WRITE(temp_str, fmt) real_array(i) ! Write real to temporary string
str_array(i) = TRIM(ADJUSTL(temp_str)) ! Trim and left-adjust the string
END DO
END FUNCTION real_to_string_array
END MODULE string_conversion
! Example program to test the module
PROGRAM test_real_to_string
USE string_conversion ! Use the module
IMPLICIT NONE
REAL :: numbers(5) = [1.234567, 89.123, -0.005, 12345.6789, -123456.789]
CHARACTER(LEN=:), ALLOCATABLE :: strings(:)
INTEGER :: i
! Call the function with format "(f0.6)"
strings = real_to_string_array(numbers, "(f0.6)")
! Print the results
DO i = 1, SIZE(strings)
PRINT *, "Number ", i, ": '", strings(i), "' (Length: ", LEN(strings(i)), ")"
END DO
! Clean up
DEALLOCATE(strings)
END PROGRAM test_real_to_string
with output
Number 1 : '1.234567 ' (Length: 14 )
Number 2 : '89.123001 ' (Length: 14 )
Number 3 : '-.005000 ' (Length: 14 )
Number 4 : '12345.678711 ' (Length: 14 )
Number 5 : '-123456.789062' (Length: 14 )
I think having coders who are at least mid-level proficient in every programming language, available 24/7, for free, is a boon.