66 integer,
parameter :: max_lines = 20
67 character(len=256),
dimension(max_lines),
public :: message
68 character(len=68),
parameter,
public :: hyphens = &
69 '--------------------------------------------------------------------'
70 character(len=69),
parameter,
public :: shyphens =
'*'//hyphens
72 character(len=512),
private :: msg
74 character(len=64),
private :: oct_status =
'undefined'
76 type(sihash_t),
private :: namespace_unit
77 type(sphash_t),
private :: namespace_mpi_grp
78 character(len=256),
private :: msg_dir =
'exec'
110 integer :: experimentals
111 integer :: current_line
117 integer,
intent(in) :: signum
118 character(len=*),
intent(out) :: signame
131 character(len=*),
intent(in),
optional :: output_dir
133 logical :: trap_signals
135 if (
present(output_dir))
then
136 msg_dir = trim(output_dir)
185 type(sihash_iterator_t) :: it
190 if (experimentals > 0 .or. warnings > 0)
then
196 if (warnings > 0)
then
199 if (warnings > 1)
then
207 if (experimentals > 0)
then
211 if (experimentals > 1)
then
218 call messages_write(
' Since you used one or more experimental features, results are likely')
220 call messages_write(
' wrong and should not be considered as valid scientific data. Check')
223 call messages_write(
' https://www.octopus-code.org/documentation/main/variables/execution/debug/experimentalfeatures')
226 call messages_write(
' or contact the octopus developers for details.')
231 open(unit =
iunit_out, file = trim(msg_dir) //
'/messages', action =
'write')
232 write(
iunit_out,
'(a, i9)')
"warnings = ", warnings
233 write(
iunit_out,
'(a, i9)')
"experimental = ", experimentals
238 call it%start(namespace_unit)
239 do while(it%has_next())
241 if (iu /= stderr .and. iu /= stdout)
call io_close(iu)
251 type(
namespace_t),
optional,
intent(in) :: namespace
255 if (
present(namespace))
then
257 if (namespace%get()==
"")
then
262 iunit =
sihash_lookup( namespace_unit, namespace%get(), found)
264 if (.not. found)
then
266 iunit =
io_open(
"log", namespace=namespace, action=
"write")
271 write(message(1),*)
"Cannot get unit for namespace ", namespace%get()
285 type(
mpi_grp_t),
target,
intent(in) :: mpigrp
288 assert(namespace_mpi_grp%is_associated())
295 type(
namespace_t),
optional,
intent(in) :: namespace
298 class(*),
pointer :: value
301 if (
present(namespace))
then
303 assert(namespace_mpi_grp%is_associated())
305 value =>
sphash_lookup(namespace_mpi_grp, trim(namespace%get()), found)
316 write(message(1),*)
"Cannot get mpi_grp for namespace ",namespace%get()
327 integer,
optional,
intent(in) :: no_lines
328 logical,
optional,
intent(in) :: only_root_writes
329 type(
namespace_t),
optional,
intent(in) :: namespace
332 integer :: ii, no_lines_
333 logical :: only_root_writes_, should_write
334 integer,
allocatable :: recv_buf(:)
335 type(mpi_request),
allocatable :: recv_req(:)
337 integer,
parameter :: fatal_tag = 32767
339 type(mpi_request) :: send_req
342 no_lines_ = current_line
343 if (
present(no_lines)) no_lines_ = no_lines
347 if (
present(only_root_writes))
then
348 should_write =
mpi_grp_is_root(msg_mpi_grp) .or. (.not. only_root_writes)
349 only_root_writes_ = only_root_writes
351 should_write = .
true.
352 only_root_writes_ = .false.
361 if (.not. only_root_writes_)
then
362 if (msg_mpi_grp%rank == 0)
then
368 call mpi_recv_init(recv_buf(ii), 1, mpi_integer, ii, fatal_tag, msg_mpi_grp%comm, recv_req(ii),
mpi_err)
377 call mpi_send_init(1, 1, mpi_integer, 0, fatal_tag, msg_mpi_grp%comm, send_req,
mpi_err)
382 call mpi_test(send_req, received, mpi_status_ignore,
mpi_err)
384 should_write = .false.
398 write(msg,
'(a)')
'*** Fatal Error (description follows)'
401 if (
present(namespace))
then
402 if (len_trim(namespace%get()) > 0)
then
403 write(msg,
'(3a)')
'* In namespace ', trim(namespace%get()),
':'
409 if (.not. only_root_writes_ .or. .not.
mpi_grp_is_root(msg_mpi_grp))
then
411 write(msg,
'(a,i4)')
"* From node = ", msg_mpi_grp%rank
417 write(msg,
'(a,1x,a)')
'*', trim(message(ii))
424 if (
debug%trace)
then
427 write(msg,
'(a)')
'* Stack: '
430 write(msg,
'(a,a)')
' > ', trim(
sub_stack(ii))
436 if (should_write)
then
450 integer,
optional,
intent(in) :: no_lines
451 logical,
optional,
intent(in) :: all_nodes
452 type(
namespace_t),
optional,
intent(in) :: namespace
454 integer :: il, no_lines_
455 integer :: iunit_namespace
456 logical :: have_to_write, all_nodes_
459 no_lines_ = current_line
460 if (
present(no_lines)) no_lines_ = no_lines
462 warnings = warnings + 1
470 if (
present(all_nodes))
then
471 have_to_write = have_to_write .or. all_nodes
472 all_nodes_ = all_nodes
475 if (have_to_write)
then
478 if (iunit_namespace /= stdout)
then
481 write(msg,
'(a)')
'** Warning:'
483 if (iunit_namespace /= stdout)
then
487 if (
present(namespace))
then
488 if (len_trim(namespace%get()) > 0)
then
489 write(msg,
'(3a)')
'** In namespace ', trim(namespace%get()),
':'
496 write(msg ,
'(a,i4)')
'** From node = ',
mpi_world%rank
498 if (iunit_namespace /= stdout)
then
505 write(msg ,
'(a,3x,a)')
'**', trim(message(il))
507 if (iunit_namespace /= stdout)
then
512 if (iunit_namespace /= stdout)
then
518 if (iunit_namespace /= stdout)
then
519 flush(iunit_namespace)
530 subroutine messages_info(no_lines, iunit, verbose_limit, stress, all_nodes, namespace)
531 integer,
optional,
intent(in) :: no_lines
532 integer,
optional,
intent(in) :: iunit
533 logical,
optional,
intent(in) :: verbose_limit
534 logical,
optional,
intent(in) :: stress
535 logical,
optional,
intent(in) :: all_nodes
536 type(
namespace_t),
optional,
intent(in) :: namespace
538 integer :: il, no_lines_
542 assert(.not. (
present(iunit) .and.
present(namespace)))
544 if (
present(iunit))
then
556 no_lines_ = current_line
557 if (
present(no_lines)) no_lines_ = no_lines
559 if (
present(stress))
then
564 if (.not.
present(verbose_limit) .or.
debug%info)
then
565 write(msg,
'(a)') trim(message(il))
569 if (
present(stress))
then
584 character(len=*),
intent(in) :: status
590 call loct_rm(trim(msg_dir) //
'/oct-status-running')
591 call loct_rm(trim(msg_dir) //
'/oct-status-finished')
592 call loct_rm(trim(msg_dir) //
'/oct-status-aborted')
593 if (oct_status /=
'walltimer-aborted')
then
594 call loct_rm(trim(msg_dir) //
'/oct-status-walltimer-aborted')
600 open(unit=
iunit_err, file=trim(msg_dir) //
'/oct-status-'//trim(status), &
601 action=
'write', status=
'unknown')
608 integer(int64),
intent(in) :: size
609 character(len=*),
intent(in) :: file
610 integer,
intent(in) :: line
612 write(message(1),
'(a,i18,3a,i5)')
"Failed to allocate ",
size,
" words in file '", trim(file),
"' line ", line
619 integer(int64),
intent(in) :: size
620 character(len=*),
intent(in) :: file
621 integer,
intent(in) :: line
623 write(message(1),
'(a,i18,3a,i5)')
"Failed to deallocate array of ",
size,
" words in file '", trim(file),
"' line ", line
631 character(len=*),
intent(in) :: var
632 character(len=*),
optional,
intent(in) :: details
633 integer,
optional,
intent(in) :: row
634 integer,
optional,
intent(in) :: column
636 character(len=10) :: row_str, column_str
638 call messages_write(
'Input error in the input variable '// trim(var))
640 if (
present(row))
then
644 write(row_str,
'(I10)') row + 1
646 if (
present(column))
then
647 write(column_str,
'(I10)') column + 1
651 if (
present(details))
then
660 call messages_write(
'You can get the documentation of the variable with the command:', new_line = .
true.)
668 character(len=*),
intent(in) :: var
669 integer,
intent(in) :: val
670 integer,
optional,
intent(in) :: iunit
671 type(
namespace_t),
optional,
intent(in) :: namespace
673 character(len=10) :: intstring
675 assert(.not. (
present(iunit) .and.
present(namespace)))
677 write(intstring,
'(i10)') val
678 message(1) =
'Input: ['//trim(var)//
' = '//trim(adjustl(intstring))//
']'
685 character(len=*),
intent(in) :: var
686 character(len=*),
intent(in) :: val
687 integer,
optional,
intent(in) :: iunit
688 type(
namespace_t),
optional,
intent(in) :: namespace
690 assert(.not. (
present(iunit) .and.
present(namespace)))
692 message(1) =
'Input: ['//trim(var)//
' = '//trim(val)//
']'
699 character(len=*),
intent(in) :: var
700 real(real64),
intent(in) :: val
701 type(
unit_t),
optional,
intent(in) :: unit
702 integer,
optional,
intent(in) :: iunit
703 type(
namespace_t),
optional,
intent(in) :: namespace
705 character(len=11) :: floatstring
707 assert(.not. (
present(iunit) .and.
present(namespace)))
709 if (.not.
present(unit))
then
710 write(floatstring,
'(g11.4)') val
711 message(1) =
'Input: ['//trim(var)//
' = '//trim(adjustl(floatstring))//
']'
714 message(1) =
'Input: ['//trim(var)//
' = '//trim(adjustl(floatstring))//
' '//trim(
units_abbrev(unit))//
']'
722 character(len=*),
intent(in) :: var
723 logical,
intent(in) :: val
724 integer,
optional,
intent(in) :: iunit
725 type(
namespace_t),
optional,
intent(in) :: namespace
727 character(len=3) :: lstring
729 assert(.not. (
present(iunit) .and.
present(namespace)))
736 message(1) =
'Input: ['//trim(var)//
' = '//trim(lstring)//
']'
743 character(len=*),
intent(in) :: var
744 real(real64),
intent(in) :: val(:)
745 type(
unit_t),
optional,
intent(in) :: unit
746 integer,
optional,
intent(in) :: iunit
747 type(
namespace_t),
optional,
intent(in) :: namespace
750 character(len=11) :: floatstring
752 assert(.not. (
present(iunit) .and.
present(namespace)))
756 write(floatstring,
'(g11.4)') val(ii)
761 if (
present(unit))
then
772 character(len=*),
intent(in) :: var
773 integer,
optional,
intent(in) :: iunit
774 type(
namespace_t),
optional,
intent(in) :: namespace
779 assert(.not. (
present(iunit) .and.
present(namespace)))
785 if (
present(iunit))
then
796 character(len=*),
intent(in) :: var
797 integer(int64),
intent(in) :: option
798 character(len=*),
optional,
intent(in) :: pre
799 integer,
optional,
intent(in) :: iunit
800 type(
namespace_t),
optional,
intent(in) :: namespace
802 integer :: option4, iunit_
805 assert(.not. (
present(iunit) .and.
present(namespace)))
810 option4 = int(option, int32)
812 if (
present(iunit))
then
823 character(len=*),
intent(in) :: var
824 integer(int32),
intent(in) :: option
825 character(len=*),
optional,
intent(in) :: pre
826 integer,
optional,
intent(in) :: iunit
827 type(
namespace_t),
optional,
intent(in) :: namespace
829 assert(.not. (
present(iunit) .and.
present(namespace)))
837 character(len=*),
optional,
intent(in) :: msg
838 integer,
optional,
intent(in) :: iunit
839 type(
namespace_t),
optional,
intent(in) :: namespace
841 integer,
parameter :: max_len = 70
843 integer :: ii, jj, length
845 character(len=70) :: str
846 character(len=max_len) :: msg_combined
849 if (
present(iunit))
then
858 if (
present(msg))
then
860 if (len_trim(msg) > max_len)
then
861 msg_combined = trim(msg(1:max_len))
863 msg_combined = trim(msg)
865 length = len_trim(msg_combined)
870 do ii = 1, (max_len - (length + 2))/2
879 str(jj:jj) = msg_combined(ii:ii)
909 character(len = *),
intent(in) :: str
910 integer,
intent(in) :: iunit
911 character(len = *),
optional,
intent(in) :: adv
913 character(len = 20) :: adv_
916 if (
present(adv)) adv_ = trim(adv)
918 write(iunit,
'(a)', advance=adv_) trim(str)
924 character(len = *),
intent(in) :: str
928 call date_and_time(
values=val)
930 write(message(3),
'(a,i4,a1,i2.2,a1,i2.2,a,i2.2,a1,i2.2,a1,i2.2)') &
931 str , val(1),
"/", val(2),
"/", val(3), &
932 " at ", val(5),
":", val(6),
":", val(7)
942 subroutine time_sum(sec1, usec1, sec2, usec2)
943 integer,
intent(in) :: sec1
944 integer,
intent(in) :: usec1
945 integer,
intent(inout) :: sec2
946 integer,
intent(inout) :: usec2
951 usec2 = usec1 + usec2
954 if (usec2 >= 1000000)
then
956 usec2 = usec2 - 1000000
965 character(len=*),
intent(in) :: name
966 character(len=*),
optional,
intent(in) :: rep
970 write(message(1),
'(a)')
'Input variable '//trim(name)//
' is obsolete.'
972 if (
present(rep))
then
973 write(message(2),
'(a)')
' '
974 write(message(3),
'(a)')
'Equivalent functionality can be obtained with the '//trim(rep)
975 write(message(4),
'(a)')
'variable. Check the documentation for details.'
976 write(message(5),
'(a)')
'(You can use the `oct-help -p '//trim(rep)//
'` command).'
989 character(len=*),
intent(in) :: name
993 write(message(1),
'(a)')
'Input variable `'//trim(name)//
'` must be defined as a block.'
994 write(message(2),
'(a)')
'Please check the documentation for details.'
995 write(message(3),
'(a)')
'(You can use the `oct-help -p '//trim(name)//
'` command).'
1004 character(len=*),
intent(in) :: name
1005 type(
namespace_t),
optional,
intent(in) :: namespace
1007 experimentals = experimentals + 1
1009 if (.not.
conf%devel_version)
then
1013 call messages_write(
'If you still want to use this feature (at your own risk), check:')
1016 call messages_write(
'https://www.octopus-code.org/documentation/main/variables/execution/debug/experimentalfeatures')
1020 write(message(1),
'(a)') trim(name)//
' is under development.'
1021 write(message(2),
'(a)')
'It might not work or produce wrong results.'
1025 warnings = warnings - 1
1032 character(len=*),
intent(in) :: feature
1033 type(
namespace_t),
optional,
intent(in) :: namespace
1037 message(1) = trim(feature)//
" not implemented."
1054 current_line = current_line + 1
1055 message(current_line) =
''
1057 if (current_line > max_lines) stop
'Too many message lines.'
1063 real(real64),
intent(in) :: val
1064 character(len=*),
optional,
intent(in) :: fmt
1065 logical,
optional,
intent(in) :: new_line
1066 type(
unit_t),
optional,
intent(in) :: units
1067 logical,
optional,
intent(in) :: align_left
1068 logical,
optional,
intent(in) :: print_units
1070 character(len=30) :: number
1071 real(real64) :: tval
1076 if (
present(fmt))
then
1077 write(number,
'('//trim(fmt)//
')') tval
1079 write(number,
'(f12.6)') tval
1083 number = adjustl(number)
1084 number(1:len(number)) =
' '//number(1:len(number)-1)
1087 write(message(current_line),
'(a, a)') trim(message(current_line)), trim(number)
1090 write(message(current_line),
'(a, a, a)') trim(message(current_line)),
' ', trim(
units_abbrev(units))
1099 integer(int64),
intent(in) :: val
1100 character(len=*),
optional,
intent(in) :: fmt
1101 logical,
optional,
intent(in) :: new_line
1102 type(
unit_t),
optional,
intent(in) :: units
1103 logical,
optional,
intent(in) :: print_units
1105 character(len=20) :: number
1106 real(real64) :: val_conv_float
1108 if (
present(units))
then
1111 if (
present(fmt))
then
1112 write(message(current_line),
'(a, '//trim(fmt)//
')') trim(message(current_line)), val_conv_float
1114 write(number,
'(f15.3)') val_conv_float
1115 write(message(current_line),
'(3a)') trim(message(current_line)),
' ', trim(adjustl(number))
1120 if (
present(fmt))
then
1121 write(message(current_line),
'(a, '//trim(fmt)//
')') trim(message(current_line)), val
1123 write(number,
'(i12)') val
1124 write(message(current_line),
'(3a)') trim(message(current_line)),
' ', trim(adjustl(number))
1131 write(message(current_line),
'(a, a, a)') trim(message(current_line)),
' ', trim(adjustl(
units_abbrev(units)))
1134 if (
present(new_line))
then
1142 integer(int32),
intent(in) :: val
1143 character(len=*),
optional,
intent(in) :: fmt
1144 logical,
optional,
intent(in) :: new_line
1146 logical,
optional,
intent(in) :: print_units
1154 character(len=*),
intent(in) :: val
1155 character(len=*),
optional,
intent(in) :: fmt
1156 logical,
optional,
intent(in) :: new_line
1158 character(len=100) :: fmt_
1160 if (len(trim(message(current_line))) + len(trim(val)) > len(message(current_line)))
then
1163 write(0, *)
"Exceeded message line length limit, to write string:", trim(val)
1166 write(message(current_line),
'(a, '//trim(fmt_)//
')') trim(message(current_line)), trim(val)
1169 if (
present(new_line))
then
1177 logical,
intent(in) :: val
1178 logical,
optional,
intent(in) :: new_line
1180 character(len=3) :: text
1188 if (len(trim(message(current_line))) + len(trim(text)) > len(message(current_line)))
then
1189 write(message(current_line + 1),
'(3a)')
"Exceeded message line length limit, to write logical value '", trim(text),
"'"
1193 write(message(current_line),
'(a,1x,a)') trim(message(current_line)), trim(text)
1195 if (
present(new_line))
then
1203 integer,
intent(in) :: isignal
1206 character(len=300) :: description
1210 write(msg,
'(a,i2)')
''
1212 write(msg,
'(a,i2)')
'%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%'
1214 write(msg,
'(a,i2)')
''
1216 write(msg,
'(a,i2,2a)')
' Octopus was killed by signal ', isignal,
': ', trim(description)
1218 write(msg,
'(a,i2)')
''
1220 write(msg,
'(a)')
' Note: Octopus is currently trapping signals. This might prevent the'
1222 write(msg,
'(a)')
' use of debuggers or the generation of core dumps. To change this'
1224 write(msg,
'(a)')
' behavior, use the DebugTrapSignals input option.'
1226 write(msg,
'(a,i2)')
''
1228 write(msg,
'(a,i2)')
'%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%'
1231 if (
debug%trace)
then
1234 write(msg,
'(a)')
'Octopus debug trace: '
1237 write(msg,
'(a,a)')
' > ', trim(
sub_stack(ii))
1242 write(msg,
'(a)')
" Octopus debug trace not available. You can enable it with 'Debug = trace'."
1261 character(len=*),
intent(in) :: s, f
1262 integer,
intent(in) :: l
1277 call messages_write(
'This should not happen and is likely a bug in the code.')
1279 call messages_write(
'Please contact the developers and report how this occurred.')
1281 call messages_write(
'You can open an issue on gitlab as described in Contributing.md.')
1295 integer(c_int),
intent(in) :: isignal
Prints out to iunit a message in the form: ["InputVariable" = value] where "InputVariable" is given b...
subroutine handle_segv(isignal)
subroutine assert_die(s, f, l)
This subroutine is called by the assert macro, it is not in a module so it can be called from any fil...
character(len=max_path_len) function, public debug_clean_path(filename)
Prune a filename path to only include subdirectories of the "src" directory.
type(debug_t), save, public debug
subroutine, public debug_init(this, namespace)
integer, public no_sub_stack
character(len=80), dimension(50), public sub_stack
The stack.
type(conf_t), public conf
Global instance of Octopus configuration.
subroutine, public io_close(iunit, grp)
subroutine, public io_mkdir(fname, namespace, parents)
integer, parameter, public iunit_out
integer, parameter, public iunit_err
integer function, public io_open(file, namespace, action, status, form, position, die, recl, grp)
subroutine, public alloc_error(size, file, line)
subroutine, public messages_end()
subroutine messages_write_integer8(val, fmt, new_line, units, print_units)
subroutine, public messages_print_with_emphasis(msg, iunit, namespace)
subroutine, public messages_not_implemented(feature, namespace)
subroutine, public messages_init(output_dir)
subroutine messages_print_var_option_8(var, option, pre, iunit, namespace)
subroutine messages_print_var_valuear(var, val, unit, iunit, namespace)
subroutine, public messages_variable_is_block(namespace, name)
subroutine, public messages_warning(no_lines, all_nodes, namespace)
subroutine messages_write_integer(val, fmt, new_line, units, print_units)
subroutine, public time_sum(sec1, usec1, sec2, usec2)
Computes t2 <- t1+t2. Parameters as in time_diff Assert: t1,2 <= 0.
subroutine messages_print_var_option_4(var, option, pre, iunit, namespace)
subroutine, public messages_obsolete_variable(namespace, name, rep)
subroutine, public messages_switch_status(status)
create status file for asynchronous communication
subroutine, public print_date(str)
subroutine flush_msg(str, iunit, adv)
subroutine, public messages_print_var_info(var, iunit, namespace)
subroutine, public messages_update_mpi_grp(namespace, mpigrp)
subroutine, public messages_info(no_lines, iunit, verbose_limit, stress, all_nodes, namespace)
subroutine, public messages_new_line()
subroutine, public dealloc_error(size, file, line)
subroutine messages_print_var_values(var, val, iunit, namespace)
subroutine, public messages_fatal(no_lines, only_root_writes, namespace)
subroutine messages_print_var_valuei(var, val, iunit, namespace)
subroutine, public messages_input_error(namespace, var, details, row, column)
subroutine messages_print_var_valuer(var, val, unit, iunit, namespace)
integer, parameter, private sleepytime_nonwriters
seconds
subroutine, public messages_experimental(name, namespace)
subroutine messages_print_var_valuel(var, val, iunit, namespace)
subroutine messages_write_logical(val, new_line)
subroutine messages_write_str(val, fmt, new_line)
type(mpi_grp_t) function messages_get_mpi_grp(namespace)
subroutine, public messages_dump_stack(isignal)
integer function messages_get_unit(namespace)
subroutine messages_write_float(val, fmt, new_line, units, align_left, print_units)
subroutine messages_reset_lines()
logical function mpi_grp_is_root(grp)
Is the current MPI process of grpcomm, root.
type(mpi_grp_t), public mpi_world
integer, public mpi_err
used to store return values of mpi calls
type(namespace_t), public global_namespace
logical function, public parse_is_defined(namespace, name)
This module implements a simple hash table for string valued keys and integer values using the C++ ST...
subroutine, public sihash_insert(h, key, val)
Insert a (key, val) pair into the hash table h.
subroutine, public sihash_init(h)
Initialize a hash table h with size entries. Since we use separate chaining, the number of entries in...
integer function, public sihash_lookup(h, key, found)
Look up a value in the hash table h. If found is present, it indicates if key could be found in the t...
subroutine, public sihash_end(h)
Free a hash table.
This module implements a simple hash table for string valued keys and integer values using the C++ ST...
subroutine, public sphash_init(h)
Initialize a hash table h with size entries. Since we use separate chaining, the number of entries in...
subroutine, public sphash_insert(h, key, val, clone)
Insert a (key, val) pair into the hash table h. If clone=.true., the object will be copied.
subroutine, public sphash_end(h)
Free a hash table.
class(*) function, pointer, public sphash_lookup(h, key, found)
Look up a value in the hash table h. If found is present, it indicates if key could be found in the t...
character(len=80) function, public str_center(s_in, l_in)
puts space around string, so that it is centered
brief This module defines the class unit_t which is used by the unit_systems_oct_m module.
character(len=20) pure function, public units_abbrev(this)
subroutine, public varinfo_print_option(iunit, var, option, pre)
subroutine, public varinfo_print(iunit, var, ierr)
This is defined even when running serial.
real(real64) function values(xx)