cube_t Derived Type

type, public :: cube_t


Components

Type Visibility Attributes Name Initial
type(ascii_t), public :: ascii
type(bmp_t), public, allocatable :: bmp
logical, public :: epsilon_flag = .false.
logical, public :: is_switched_to_bmp = .false.
logical, public :: single_flag = .true.
type(segment_t), public, allocatable :: sps(:)

Type-Bound Procedures

  • private pure subroutine cube_add__symbol(self, symbol)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    character(len=*), intent(in) :: symbol
  • private pure subroutine cube_add__segment(self, segment)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(segment_t), intent(in) :: segment
  • private pure subroutine cube_add__segment_list(self, seglist)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(segment_t), intent(in) :: seglist(:)
  • private pure subroutine cube_add__cube(self, cube)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(cube_t), intent(in) :: cube

procedure, public :: cube2seg => cube__bmp2seg

  • private pure subroutine cube__bmp2seg(self, segments)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(in) :: self
    type(segment_t), intent(inout), allocatable :: segments(:)

procedure, public :: cube_add__cube

  • private pure subroutine cube_add__cube(self, cube)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(cube_t), intent(in) :: cube

procedure, public :: cube_add__segment

  • private pure subroutine cube_add__segment(self, segment)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(segment_t), intent(in) :: segment

procedure, public :: cube_add__segment_list

  • private pure subroutine cube_add__segment_list(self, seglist)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    type(segment_t), intent(in) :: seglist(:)

procedure, public :: cube_add__symbol

  • private pure subroutine cube_add__symbol(self, symbol)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self
    character(len=*), intent(in) :: symbol

procedure, public :: first => cube__first_codepoint

  • private pure function cube__first_codepoint(self) result(ret)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(in) :: self

    Return Value integer

procedure, public :: flag_epsilon => cube_flag__epsilon

  • private pure subroutine cube_flag__epsilon(self)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self

procedure, public :: invert => cube__invert

  • private pure subroutine cube__invert(self)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(inout) :: self

procedure, public :: is_flagged_epsilon => cube_flag__is_flagged_epsilon

procedure, public :: num => cube__number_of_flagged_bits

  • private pure function cube__number_of_flagged_bits(self) result(ret)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(in) :: self

    Return Value integer

procedure, public :: print_sps => cube__dump_sps

  • private subroutine cube__dump_sps(self)

    Arguments

    Type IntentOptional Attributes Name
    class(cube_t), intent(in) :: self

procedure, public :: switch_bmp => cube__switch_ascii_to_bmp

Source Code

   type, public :: cube_t ! contains all planes (ascii, BMP and SPs) of Unicode.
      logical :: epsilon_flag = .false.
      logical :: single_flag = .true.
      logical :: is_switched_to_bmp = .false.
      type(ascii_t) :: ascii                 ! for  U+0000 .. U+007F ASCII
      type(bmp_t), allocatable :: bmp        ! for  U+0000 .. U+FFFF BMP
      type(segment_t), allocatable :: sps(:) ! for U+10000 .. U+10FFFF SPs (SIP, SMP, etc.)
   contains
      procedure :: flag_epsilon => cube_flag__epsilon
      procedure :: is_flagged_epsilon => cube_flag__is_flagged_epsilon
      procedure :: cube_add__symbol
      procedure :: cube_add__segment
      procedure :: cube_add__segment_list
      procedure :: cube_add__cube
      procedure :: switch_bmp => cube__switch_ascii_to_bmp
      procedure :: cube2seg => cube__bmp2seg
      procedure :: print_sps => cube__dump_sps
      procedure :: invert => cube__invert
      procedure :: num => cube__number_of_flagged_bits
      procedure :: first => cube__first_codepoint
      generic :: add => cube_add__symbol, cube_add__segment, cube_add__segment_list, cube_add__cube
   end type cube_t