Description
This is another edge case that the TextMate bundle did not account for. Some keywords should be escaped as when not matching their normal regex pattern.
interface set_scalar_field_from_python
module procedure set_scalar_field_from_python_sp
subroutine set_scalar_field_from_python(function, function_len, dim, &
nodes, x, y, z, t, result, stat)
use iso_c_binding, only: c_double, c_int, c_char
implicit none
integer(c_int), intent(in), value :: function_len
character(kind=c_char, len=function_len) :: function
integer(c_int), intent(in), value :: dim, nodes
real(c_double), dimension(nodes), intent(in) :: x, y, z
real(c_double), intent(in), value :: t
real(c_double), dimension(nodes), intent(out) :: result
integer(c_int), intent(out) :: stat
end subroutine set_scalar_field_from_python
end interface set_scalar_field_from_python