|
type(triangles) function, public | triangles_new (ndp) |
| initialize triangles
|
|
subroutine | triangles_delete (this) |
| delete triangles
|
|
integer function | triangles_compute_r (xd, yd, tri) |
|
integer function | triangles_compute_d (xd, yd, tri) |
|
integer function | triangles_compute_c (co, tri) |
|
integer function | contng_simc (co, nt, ipt, nl, ipl) |
| THIS SUBROUTINE PERFORMS TRIANGULATION.
|
|
integer function | conxch_simc (x, y, i1, i2, i3, i4) |
| THIS FUNCTION DETERMINES WHETHER OR NOT THE EXCHANGE OF TWO TRIANGLES IS NECESSARY ON THE BASIS OF MAX-MIN-ANGLE CRITERION BY C.
|
|
Space utilities, derived from NCAR software.
Simple example program
#include "config.h"
#ifdef HAVE_LIBNCARG
USE ncar_plot_class
#endif
IMPLICIT NONE
integer,dimension(:),allocatable :: seed
integer :: k,i
integer,parameter :: ndp=10000
type(xy), DIMENSION(ndp) :: co
integer :: status
character(len=512):: a_name
INTEGER :: category, ier
type(triangles) :: tri
#ifdef HAVE_LIBNCARG
type(ncar_plot) :: plot
#endif
call l4f_launcher(a_name,a_name_force="example_space")
category=l4f_category_get(a_name//".main")
call random_seed(size=k)
allocate (seed(k))
seed=5
call random_seed(put=seed)
call random_number(co%x)
call random_number(co%y)
tri=triangles_new(ndp)
status = triangles_compute(co,tri)
#ifdef HAVE_LIBNCARG
call init(plot,pstype='PS', orient='LANDSCAPE',color='COLOR',file="example_space_utilities.ps")
call plot_triangles(plot,co,tri,"SIMC")
#endif
call l4f_category_delete(category)
END program
Destructor for the line_split class.
Set of functions that return a trimmed CHARACTER representation of the input variable.
Emit log message for a category with specific priority.
Global log4fortran constructor.
Utilities for CHARACTER variables.
classe per la gestione del logging
Space utilities, derived from NCAR software.