-
-
Notifications
You must be signed in to change notification settings - Fork 51
Open
Labels
bugSomething isn't workingSomething isn't working
Description
Describe the bug
hover over ARRAY shows the wrong dimension
PROGRAM test_associate_block
IMPLICIT NONE
REAL :: A(5), B(5,5), C, III = 1
ASSOCIATE (ARRAY => B(:,1))
ARRAY (3) = ARRAY (1) + ARRAY (2)
END ASSOCIATE
END PROGRAM test_associate_blockI think we can get away with creating a function to parse the dimensions of arrays (see parse_fortan.py near the fortran_var AST node add.), then copy the keywords from the link_obj but impose our own keyword_info i.e. the slice.
Metadata
Metadata
Assignees
Labels
bugSomething isn't workingSomething isn't working