GetColumn
Calling example:
GetColumn(obj, globalnode, idof, value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode, ivar, idof, value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode, ivar, spacecompo, timecompo, value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode, ivar, spacecompo, timecompo(:), value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode, ivar, spacecompo(:), timecompo, value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode(:), ivar, spacecompo, timecompo(:), value(:), nodefieldval, scale, addcontribution
GetColumn(obj, globalnode(:), ivar, spacecompo(:), timecompo, value(:), nodefieldval, scale, addcontribution
Interface 1
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn1(obj, globalNode, idof, VALUE, nodeFieldVal, &
& scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode
INTEGER(I4B), INTENT(IN) :: idof
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn1
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
and idof
.
globalNode
is the global node numberidof
is the degree of freedom number
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 2
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn2(obj, globalNode, ivar, idof, &
& VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: idof
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn2
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, idof
.
globalNode
is the global node numberivar
is the physical variable numberidof
is the degree of freedom number of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 3
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn3(obj, globalNode, ivar, spacecompo, &
& timecompo, VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: spacecompo
INTEGER(I4B), INTENT(IN) :: timecompo
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn3
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, spacecompo
, timecompo
.
globalNode
is the global node numberivar
is the physical variable numberspacecompo
is the spatial component of the physical variabletimecompo
is the temporal component of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 4
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn4(obj, globalNode, ivar, spacecompo, &
& timecompo, VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: spacecompo
INTEGER(I4B), INTENT(IN) :: timecompo(:)
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn4
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, spacecompo
, timecompo
.
globalNode
is the global node numberivar
is the physical variable numberspacecompo
is the spatial component of the physical variabletimecompo
is the temporal component of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 5
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn5(obj, globalNode, ivar, spacecompo, &
& timecompo, VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: spacecompo(:)
INTEGER(I4B), INTENT(IN) :: timecompo
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn5
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, spacecompo
, timecompo
.
globalNode
is the global node numberivar
is the physical variable numberspacecompo
is the spatial component of the physical variabletimecompo
is the temporal component of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 6
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn6(obj, globalNode, ivar, spacecompo, &
& timecompo, VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode(:)
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: spacecompo
INTEGER(I4B), INTENT(IN) :: timecompo(:)
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn6
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, spacecompo
, timecompo
.
globalNode
is the global node numberivar
is the physical variable numberspacecompo
is the spatial component of the physical variabletimecompo
is the temporal component of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field
Interface 7
- ܀ See Interface
- ↢
INTERFACE
SUBROUTINE getColumn7(obj, globalNode, ivar, spacecompo, &
& timecompo, VALUE, nodeFieldVal, scale, addContribution)
CLASS(MatrixField_), INTENT(IN) :: obj
INTEGER(I4B), INTENT(IN) :: globalNode(:)
INTEGER(I4B), INTENT(IN) :: ivar
INTEGER(I4B), INTENT(IN) :: spacecompo(:)
INTEGER(I4B), INTENT(IN) :: timecompo
REAL(DFP), OPTIONAL, INTENT(INOUT) :: VALUE(:)
CLASS(AbstractNodeField_), OPTIONAL, INTENT(INOUT) :: nodeFieldVal
REAL(DFP), OPTIONAL, INTENT(IN) :: scale
LOGICAL(LGT), OPTIONAL, INTENT(IN) :: addContribution
END SUBROUTINE getColumn7
END INTERFACE
This routine returns the column of a sparse matrix. The column index is
calculated using the globalNode
, ivar
, spacecompo
, timecompo
.
globalNode
is the global node numberivar
is the physical variable numberspacecompo
is the spatial component of the physical variabletimecompo
is the temporal component of the physical variable
If value
is present then the vector is returned inside the rank 1 vector
If nodeFieldVal
is present then the column is returned inside the node
field