My Project
Public Member Functions | List of all members
mod_nctools::nc_make_att Interface Reference

Public Member Functions

type(ncatt) function, pointer nc_make_att_chr_scl (NAME, VALUES)
 
type(ncatt) function, pointer nc_make_att_chr_vec (NAME, VALUES)
 
type(ncatt) function, pointer nc_make_att_int (NAME, values)
 
type(ncatt) function, pointer nc_make_att_int_vec (NAME, values)
 
type(ncatt) function, pointer nc_make_att_flt (NAME, values)
 
type(ncatt) function, pointer nc_make_att_flt_vec (NAME, values)
 
type(ncatt) function, pointer nc_make_att_dbl (NAME, values)
 
type(ncatt) function, pointer nc_make_att_dbl_vec (NAME, values)
 

Detailed Description

Definition at line 69 of file mod_nctools.f90.

Member Function/Subroutine Documentation

◆ nc_make_att_chr_scl()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_chr_scl ( character(len=*), intent(in)  NAME,
character(len=*), intent(in)  VALUES 
)

Definition at line 627 of file mod_nctools.f90.

627  IMPLICIT NONE
628  TYPE(NCATT), POINTER :: ATT
629  character(len=*), intent(in) :: name
630  character(len=*), intent(in) :: VALUES
631 
632  att => new_att()
633 
634  att%attid = -1
635  att%ATTname = trim(name)
636  att%xtype = nf90_char
637  att%LEN = len_trim(values)
638  ALLOCATE(att%CHR(1))
639  att%CHR(1) = values
640 

◆ nc_make_att_chr_vec()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_chr_vec ( character(len=*), intent(in)  NAME,
character(len=*), dimension(:), intent(in), allocatable  VALUES 
)

Definition at line 645 of file mod_nctools.f90.

645  IMPLICIT NONE
646  TYPE(NCATT), POINTER :: ATT
647  character(len=*), intent(in) :: name
648  character(len=*),ALLOCATABLE, intent(in) :: VALUES(:)
649 
650  att => new_att()
651 
652  att%attid = -1
653  att%ATTname = trim(name)
654  att%xtype = nf90_char
655  att%LEN = -1
656  ALLOCATE(att%CHR(size(values)))
657  att%CHR = values

◆ nc_make_att_dbl()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_dbl ( character(len=*), intent(in)  NAME,
real(dp), intent(in)  values 
)

Definition at line 807 of file mod_nctools.f90.

807  IMPLICIT NONE
808  TYPE(NCATT), POINTER :: ATT
809  character(len=*), intent(in) :: name
810  REAL(DP), intent(in) :: values
811 
812  att => new_att()
813 
814  att%attid = -1
815  att%ATTname = trim(name)
816  att%xtype = nf90_double
817  att%LEN = 1
818  allocate(att%dbl(att%len))
819  att%dbl = values
820 

◆ nc_make_att_dbl_vec()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_dbl_vec ( character(len=*), intent(in)  NAME,
real(dp), dimension(:), intent(in), allocatable  values 
)

Definition at line 825 of file mod_nctools.f90.

825  IMPLICIT NONE
826  TYPE(NCATT), POINTER :: ATT
827  character(len=*), intent(in) :: name
828  REAL(DP), allocatable, intent(in) :: values(:)
829 
830  if(.not. allocated(values)) &
831  & Call fatal_error("Can not make attribute: "//trim(name),&
832  &"argument 'values' passed must be allocated and contain data")
833 
834  att => new_att()
835 
836  att%attid = -1
837  att%ATTname = trim(name)
838  att%xtype = nf90_double
839  att%LEN = size(values)
840  allocate(att%dbl(att%len))
841  att%dbl = values
842 

◆ nc_make_att_flt()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_flt ( character(len=*), intent(in)  NAME,
real(spa), intent(in)  values 
)

Definition at line 767 of file mod_nctools.f90.

767  IMPLICIT NONE
768  TYPE(NCATT), POINTER :: ATT
769  character(len=*), intent(in) :: name
770  REAL(SPA), intent(in) :: values
771 
772  att => new_att()
773 
774  att%attid = -1
775  att%ATTname = trim(name)
776  att%xtype = nf90_float
777  att%LEN = 1
778  allocate(att%flt(att%len))
779  att%flt = values
780 

◆ nc_make_att_flt_vec()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_flt_vec ( character(len=*), intent(in)  NAME,
real(spa), dimension(:), intent(in), allocatable  values 
)

Definition at line 785 of file mod_nctools.f90.

785  IMPLICIT NONE
786  TYPE(NCATT), POINTER :: ATT
787  character(len=*), intent(in) :: name
788  REAL(SPA), allocatable, intent(in) :: values(:)
789 
790  if(.not. allocated(values)) &
791  & Call fatal_error("Can not make attribute: "//trim(name),&
792  &"argument 'values' passed must be allocated and contain data")
793 
794  att => new_att()
795 
796  att%attid = -1
797  att%ATTname = trim(name)
798  att%xtype = nf90_float
799  att%LEN = size(values)
800  allocate(att%flt(att%len))
801  att%flt = values
802 

◆ nc_make_att_int()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_int ( character(len=*), intent(in)  NAME,
integer, intent(in)  values 
)

Definition at line 749 of file mod_nctools.f90.

749  IMPLICIT NONE
750  TYPE(NCATT), POINTER :: ATT
751  character(len=*), intent(in) :: name
752  INTEGER, intent(in) :: values
753 
754  att => new_att()
755 
756  att%attid = -1
757  att%ATTname = trim(name)
758  att%xtype = nf90_int
759  att%LEN = 1
760  allocate(att%int(att%len))
761  att%int = values
762 

◆ nc_make_att_int_vec()

type(ncatt) function, pointer mod_nctools::nc_make_att::nc_make_att_int_vec ( character(len=*), intent(in)  NAME,
integer, dimension(:), intent(in), allocatable  values 
)

Definition at line 727 of file mod_nctools.f90.

727  IMPLICIT NONE
728  TYPE(NCATT), POINTER :: ATT
729  character(len=*), intent(in) :: name
730  INTEGER, allocatable, intent(in) :: values(:)
731 
732  if(.not. allocated(values)) &
733  & Call fatal_error("Can not make attribute: "//trim(name),&
734  &"argument 'values' passed must be allocated and contain data")
735 
736  att => new_att()
737 
738  att%attid = -1
739  att%ATTname = trim(name)
740  att%xtype = nf90_int
741  att%LEN = size(values)
742  allocate(att%int(att%len))
743  att%int = values
744 

The documentation for this interface was generated from the following file: