mmg2d
|
API headers for the mmg2d library. More...
#include "mmg/mmg2d/libmmgtypes.h"
Go to the source code of this file.
Macros | |
#define | MMG2D_LMAX 1024 |
API headers for the mmg2d library.
#define MMG2D_LMAX 1024 |
Maximum array size when storing adjacent points (or ball) of a vertex.
enum MMG2D_Param |
Input parameters for mmg library.
Input parameters for mmg library. Options prefixed by MMG2D_IPARAM asked for integers values ans options prefixed by MMG2D_DPARAM asked for real values.
int MMG2D_Chk_meshData | ( | MMG5_pMesh | mesh, |
MMG5_pSol | met | ||
) |
mesh | pointer toward the mesh structure. |
met | pointer toward the sol structure. |
Check if the number of given entities match with mesh and sol size (not mandatory) and check mesh datas.
SUBROUTINE MMG2D_Chk_meshData(mesh,met,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,met
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_doSol | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure |
met | pointer toward the sol structure |
Compute isotropic size map according to the mean of the length of the edges passing through a point.
SUBROUTINE MMG2D_DOSOL(mesh,met,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,met
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
mesh | pointer toward the mesh structure |
sol | pointer toward the sol structure |
Compute isotropic size map according to the mean of the length of the edges passing through a point.
int MMG2D_Free_all | ( | const int | starter, |
... | |||
) |
starter | dummy argument used to initialize the variadic argument list. |
... | variadic arguments that depend to the library function that you have call. |
For the MMG2D_mmg2dlib function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&your_metric,MMG5_ARG_end).
For the MMG2D_mmg2dls function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppLs, &your_level_set,MMG5_ARG_end).
For the MMG2D_mmg2dmov function, you must call : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&empty_metric,MMG5_ARG_ppDisp, &your_displacement, MMG5_ARG_end).
Deallocations before return.
void MMG2D_Free_edges | ( | MMG5_pMesh | mesh | ) |
mesh | pointer toward the mesh structure |
Free the mesh edges (and the associated xpoints).
SUBROUTINE MMG2D_FREE_EDGES(mesh)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
END SUBROUTINE
int MMG2D_Free_names | ( | const int | starter, |
... | |||
) |
starter | dummy argument used to initialize the variadic argument list. |
... | variadic arguments that depend to the library function that you have call. |
For the MMG2D_mmg2dlib function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&your_metric,MMG5_ARG_end).
For the MMG2D_mmg2dls function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppLs, &your_level_set,MMG5_ARG_end).
For the MMG2D_mmg2dmov function, you must call : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&empty_metric,MMG5_ARG_ppDisp, &your_displacement, MMG5_ARG_end).
Structure deallocations before return.
void MMG2D_Free_solutions | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure |
sol | pointer toward the solution structure |
Free the solution.
SUBROUTINE MMG2D_FREE_SOLUTIONS(mesh,sol)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
END SUBROUTINE
int MMG2D_Free_structures | ( | const int | starter, |
... | |||
) |
starter | dummy argument used to initialize the variadic argument list. |
... | variadic arguments that depend to the library function that you have call. |
For the MMG2D_mmg2dlib function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&your_metric,MMG5_ARG_end).
For the MMG2D_mmg2dls function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppLs, &your_level_set,MMG5_ARG_end).
For the MMG2D_mmg2dmov function, you must call : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet,&empty_metric,MMG5_ARG_ppDisp, &your_displacement, MMG5_ARG_end).
Structure deallocations before return.
void MMG2D_Free_triangles | ( | MMG5_pMesh | mesh | ) |
mesh | pointer toward the mesh structure |
Free the mesh elements (and the adjacency).
SUBROUTINE MMG2D_FREE_TRIANGLES(mesh)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
END SUBROUTINE
int MMG2D_Get_adjaTri | ( | MMG5_pMesh | mesh, |
int | kel, | ||
int | listri[3] | ||
) |
Return adjacent elements of a triangle.
mesh | pointer toward the mesh structure. |
kel | triangle index. |
listri | pointer toward the table of the indices of the three adjacent triangles of the elt kel (the index is 0 if there is no adjacent). |
Find the indices of the 3 adjacent elements of triangle kel. if the
face has no adjacent element (so we are on a boundary face).
SUBROUTINE MMG2D_GET_ADJATRI(mesh,kel,listri,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: kel
INTEGER, DIMENSION(3), INTENT(OUT) :: listri
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_adjaVertices | ( | MMG5_pMesh | mesh, |
int | ip, | ||
int | lispoi[MMG2D_LMAX] | ||
) |
Return adjacent elements of a triangle.
mesh | pointer toward the mesh structure. |
ip | vertex index. |
lispoi | pointer toward an array of size MMG2D_LMAX that will contain the indices of adjacent vertices to the vertex ip. |
Find the indices of the adjacent vertices of the vertex ip.
SUBROUTINE MMG2D_GET_ADJAVERTICES(mesh,ip,lispoi,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: ip
INTEGER, DIMENSION(MMG2D_LMAX), INTENT(OUT) :: lispoi
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_adjaVerticesFast | ( | MMG5_pMesh | mesh, |
int | ip, | ||
int | start, | ||
int | lispoi[MMG2D_LMAX] | ||
) |
Return adjacent elements of a triangle.
mesh | pointer toward the mesh structure. |
ip | vertex index. |
start | index of a triangle holding ip. |
lispoi | pointer toward an array of size MMG2D_LMAX that will contain the indices of adjacent vertices to the vertex ip. |
Find the indices of the adjacent vertices of the vertex ip of the triangle start.
SUBROUTINE MMG2D_GET_ADJAVERTICESFAST(mesh,ip,start,lispoi,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: ip,start
INTEGER, DIMENSION(MMG2D_LMAX), INTENT(OUT) :: lispoi
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_edge | ( | MMG5_pMesh | mesh, |
int * | e0, | ||
int * | e1, | ||
int * | ref, | ||
int * | isRidge, | ||
int * | isRequired | ||
) |
mesh | pointer toward the mesh structure. |
e0 | pointer toward the first extremity of the edge. |
e1 | pointer toward the second extremity of the edge. |
ref | pointer toward the edge reference. |
isRidge | pointer toward the flag saying if the edge is ridge. |
isRequired | pointer toward the flag saying if the edge is required. |
Get extremities e0, e1 and reference ref of next edge of mesh.
SUBROUTINE MMG2D_GET_EDGE(mesh,e0,e1,ref,isRidge,isRequired,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(OUT) :: e0,e1
INTEGER :: ref,isRidge,isRequired
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_edges | ( | MMG5_pMesh | mesh, |
int * | edges, | ||
int * | refs, | ||
int * | areRidges, | ||
int * | areRequired | ||
) |
mesh | pointer toward the mesh structure. |
edges | pointer toward the array of edges. Vertices of the ![]() |
refs | edges references. refs[i-1] is the ref of the ![]() |
areRidges | 1 if the edge is a ridge, 0 otherwise. |
areRequired | 1 if the edge is required, 0 otherwise. |
Get vertices and references of the mesh edges.
SUBROUTINE MMG2D_GET_EDGES(mesh,edges,refs,areRidges,areRequired,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: edges(*)
INTEGER, INTENT(OUT) :: refs(*),areRequired(*),areRidges(*)
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_ithSol_inSolsAtVertices | ( | MMG5_pSol | sol, |
int | i, | ||
double * | s, | ||
int | pos | ||
) |
sol | pointer toward the array of solutions |
i | position of the solution field that we want to set. |
s | solution(s) at mesh vertex pos. |
pos | index of the vertex on which we get the solution. |
Get values of the ith field of the solution array at vertex pos.
SUBROUTINE MMG2D_GET_ITHSOL_INSOLSATVERTICES(sol,i,s,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: sol
INTEGER, INTENT(IN) :: i,pos
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_ithSols_inSolsAtVertices | ( | MMG5_pSol | sol, |
int | i, | ||
double * | s | ||
) |
sol | pointer toward the array of solutions |
i | position of the solution field that we want to get. |
s | table of the solutions at mesh vertices. The solution at vertex k is given by s[k-1] for a scalar sol, s[2*(k-1)]@2 for a vectorial solution and s[3*(k-1)]@3 for a tensor solution. |
Get values of the solution at the ith field of the solution array.
SUBROUTINE MMG2D_GET_ITHSOLS_INSOLSATVERTICES(sol,i,s,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: sol
INTEGER, INTENT(IN) :: i
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_meshSize | ( | MMG5_pMesh | mesh, |
int * | np, | ||
int * | nt, | ||
int * | na | ||
) |
recover datas
mesh | pointer toward the mesh structure. |
np | pointer toward the number of vertices. |
nt | pointer toward the number of triangles. |
na | pointer toward the number of edges. |
Get the number of vertices, triangles and edges of the mesh.
SUBROUTINE MMG2D_GET_MESHSIZE(mesh,np,nt,na,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER :: np,nt,na
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_scalarSol | ( | MMG5_pSol | met, |
double * | s | ||
) |
met | pointer toward the sol structure. |
s | pointer toward the scalar solution value. |
Get solution s of next vertex of mesh.
SUBROUTINE MMG2D_GET_SCALARSOL(met,s,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_scalarSols | ( | MMG5_pSol | met, |
double * | s | ||
) |
met | pointer toward the sol structure. |
s | table of the scalar solutions at mesh vertices. s[i-1] is the solution at vertex i. |
Get solutions at mesh vertices.
SUBROUTINE MMG2D_GET_SCALARSOLS(met,s,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_solsAtVerticesSize | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
int * | nsols, | ||
int * | nentities, | ||
int * | typSol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward an array of sol structure. |
nentities | pointer toward the number of entities. |
typSol | array of size MMG5_NSOL_MAX to store type of each solution (scalar, vector..). |
Get the solution number, dimension and type.
SUBROUTINE MMG2D_GET_SOLSATVERTICESSIZE(mesh,sol,nsols,nentities,typSol,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER :: nsols,nentities
INTEGER :: typSol(*)
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_solSize | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
int * | typEntity, | ||
int * | np, | ||
int * | typSol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
typEntity | pointer toward the type of entities to which solutions are applied. |
np | pointer toward the number of solutions. |
typSol | pointer toward the type of the solutions (scalar, vectorial...) |
Get the solution number, dimension and type.
SUBROUTINE MMG2D_GET_SOLSIZE(mesh,sol,typEntity,np,typSol,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER :: typEntity,np,typSol
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_tensorSol | ( | MMG5_pSol | met, |
double * | m11, | ||
double * | m12, | ||
double * | m22 | ||
) |
met | pointer toward the sol structure. |
m11 | pointer toward the position (1,1) in the solution tensor. |
m12 | pointer toward the position (1,2) in the solution tensor. |
m22 | pointer toward the position (2,2) in the solution tensor. |
Get tensorial solution of next vertex of mesh.
SUBROUTINE MMG2D_GET_TENSORSOL(met,m11,m12,m22,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(OUT) :: m11,m12,m22
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_tensorSols | ( | MMG5_pSol | met, |
double * | sols | ||
) |
met | pointer toward the sol structure. |
sols | table of the solutions at mesh vertices. sols[3*(i-1)]@3 is the solution at vertex i. |
Get tensorial solutions at mesh vertices.
SUBROUTINE MMG2D_GET_TENSORSOLS(met,sols,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), DIMENSION(*), INTENT(OUT) :: sols
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_triangle | ( | MMG5_pMesh | mesh, |
int * | v0, | ||
int * | v1, | ||
int * | v2, | ||
int * | ref, | ||
int * | isRequired | ||
) |
mesh | pointer toward the mesh structure. |
v0 | pointer toward the first vertex of triangle. |
v1 | pointer toward the second vertex of triangle. |
v2 | pointer toward the third vertex of triangle. |
ref | pointer toward the triangle reference. |
isRequired | pointer toward the flag saying if triangle is required. |
Get vertices v0,v1,v2 and reference ref of next triangle of mesh.
SUBROUTINE MMG2D_GET_TRIANGLE(mesh,v0,v1,v2,ref,isRequired,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(OUT) :: v0,v1,v2
INTEGER :: ref,isRequired
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_triangles | ( | MMG5_pMesh | mesh, |
int * | tria, | ||
int * | refs, | ||
int * | areRequired | ||
) |
mesh | pointer toward the mesh structure. |
tria | pointer toward the table of the triangles vertices Vertices of the ![]() |
refs | pointer toward the table of the triangles references. refs[i-1] is the ref of the ![]() |
areRequired | pointer toward table of the flags saying if triangles are required. areRequired[i-1]=1 if the ![]() |
Get vertices and references of the mesh triangles.
! SUBROUTINE MMG2D_GET_TRIANGLES(mesh,tria,refs,areRequired,retval)
! MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
! INTEGER, DIMENSION(*),INTENT(OUT) :: tria
! INTEGER, DIMENSION(*) :: refs,areRequired
! INTEGER, INTENT(OUT) :: retval
! END SUBROUTINE
int MMG2D_Get_triFromEdge | ( | MMG5_pMesh | mesh, |
int | ked, | ||
int * | ktri, | ||
int * | ied | ||
) |
mesh | pointer toward the mesh structure. |
ked | index of the boundary edge. |
ktri | pointer toward the index of the tri (filled by the function). |
ied | pointer toward the index of the edge of the triangle ktri that correspond to the boundary edge ked. |
Fill ktri by the index of the triangle to which belong a boundary edge and ied by the index of the edge of the triangle that correspond to the edge.
SUBROUTINE MMG2D_GET_TRIFROMEDGE(mesh,ked,ktri,ied,retval)
MMG5_DATA_PTR_T, INTENT(IN) :: mesh
INTEGER, INTENT(IN) :: ked
INTEGER, INTENT(OUT) :: ktri,ied,retval
END SUBROUTINE
int MMG2D_Get_trisFromEdge | ( | MMG5_pMesh | mesh, |
int | ked, | ||
int | ktri[2], | ||
int | ied[2] | ||
) |
mesh | pointer toward the mesh structure. |
ked | index of the boundary edge. |
ktri | pointer toward an array of size 2 to fill by the indices of the triangles that share the edge ked (filled by the function). |
ied | pointer toward an array of size two to fill by the indices of the edge in each triangle. |
Fill ktri by the indices of the triangles to which belong a boundary edge and ied by the indices of the matching edge in each triangle. If ked belongs to one triangle only, ktri[1] = ied[1] = 0.
SUBROUTINE MMG2D_GET_TRISFROMEDGE(mesh,ked,ktri,ied,retval)
MMG5_DATA_PTR_T, INTENT(IN) :: mesh
INTEGER, INTENT(IN) :: ked
INTEGER, DIMENSION(2),INTENT(OUT) :: ktri,ied
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_vectorSol | ( | MMG5_pSol | met, |
double * | vx, | ||
double * | vy | ||
) |
met | pointer toward the sol structure. |
vx | x value of the vectorial solution. |
vy | y value of the vectorial solution. |
Get vectorial solution of next vertex of mesh.
SUBROUTINE MMG2D_GET_VECTORSOL(met,vx,vy,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(OUT) :: vx,vy
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_vectorSols | ( | MMG5_pSol | met, |
double * | sols | ||
) |
met | pointer toward the sol structure. |
sols | table of the solutions at mesh vertices. sols[2*(i-1)]@2 is the solution at vertex i. |
Get vectorial solutions at mesh vertices
SUBROUTINE MMG2D_GET_VECTORSOLS(met,sols,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: sols
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_vertex | ( | MMG5_pMesh | mesh, |
double * | c0, | ||
double * | c1, | ||
int * | ref, | ||
int * | isCorner, | ||
int * | isRequired | ||
) |
mesh | pointer toward the mesh structure. |
c0 | pointer toward the coordinate of the point along the first dimension. |
c1 | pointer toward the coordinate of the point along the second dimension. |
ref | pointer to the point reference. |
isCorner | pointer toward the flag saying if point is corner. |
isRequired | pointer toward the flag saying if point is required. |
Get coordinates c0, c1 and reference ref of vertex num of mesh.
SUBROUTINE MMG2D_GET_VERTEX(mesh,c0,c1,ref,isCorner,isRequired,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
REAL(KIND=8), INTENT(OUT) :: c0,c1
INTEGER :: ref,isCorner,isRequired
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Get_vertices | ( | MMG5_pMesh | mesh, |
double * | vertices, | ||
int * | refs, | ||
int * | areCorners, | ||
int * | areRequired | ||
) |
mesh | pointer toward the mesh structure. |
vertices | pointer toward the table of the points coordinates. The coordinates of the ![]() |
refs | pointer to the table of the point references. The ref of the ![]() |
areCorners | pointer toward the table of the flags saying if points are corners. areCorners[i-1]=1 if the ![]() |
areRequired | pointer toward the table of flags saying if points are required. areRequired[i-1]=1 if the ![]() |
Get the coordinates and references of the mesh vertices.
! SUBROUTINE MMG2D_GET_VERTICES(mesh,vertices,refs,areCorners,&
! areRequired,retval)
! MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
! REAL(KIND=8),DIMENSION(*), INTENT(OUT) :: vertices
! INTEGER, DIMENSION(*) :: refs,areCorners,areRequired
! INTEGER, INTENT(OUT) :: retval
! END SUBROUTINE
void MMG2D_Init_fileNames | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
Initialize file names to their default values.
SUBROUTINE MMG2D_INIT_FILENAMES(mesh,sol)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
END SUBROUTINE
int MMG2D_Init_mesh | ( | const int | starter, |
... | |||
) |
starter | dummy argument used to initialize the variadic argument list |
... | variadic arguments. |
For the MMG2D_mmgslib function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppMet, &your_metric,MMG5_ARG_end).
For the MMG2D_mmgsls function, you need to call the MMG2D_Init_mesh function with the following arguments : MMG2D_Init_mesh(MMG5_ARG_start,MMG5_ARG_ppMesh, &your_mesh, MMG5_ARG_ppLs, &your_level_set,MMG5_ARG_end).
Here,your_mesh is a MMG5_pMesh, your_metric and your_level_set are MMG5_pSol.
MMG structures allocation and initialization.
void MMG2D_Init_parameters | ( | MMG5_pMesh | mesh | ) |
mesh | pointer toward the mesh structure. |
Initialization of the input parameters (stored in the Info structure).
SUBROUTINE MMG2D_INIT_PARAMETERS(mesh)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
END SUBROUTINE
int MMG2D_loadAllSols | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solutions array |
filename | name of file. |
Load 1 or more solutions in a solution file at medit file format
SUBROUTINE MMG2D_LOADALLSOLS(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
mesh | pointer toward the mesh structure. |
sol | pointer toward an allocatable sol structure. |
filename | name of file. |
Load a medit solution file containing 1 or more solutions.
Read the file header
Sol tab allocation
int MMG2D_loadMesh | ( | MMG5_pMesh | mesh, |
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
filename | name of the readed file. |
Read mesh data.
SUBROUTINE MMG2D_LOADMESH(mesh,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_loadMshMesh | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solution structure. |
filename | name of file. |
Read mesh and 0 or 1 data at MSH file format (.msh extension). We read only low-order points, edges, tria, quadra, tetra and prisms.
SUBROUTINE MMG2D_LOADMSHMESH(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_loadMshMesh_and_allData | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward a list of solution structures. |
filename | name of file. |
Read mesh and a list of data at MSH file format (.msh extension). We read only low-order points, edges, tria, quadra, tetra and prisms.
SUBROUTINE MMG2D_LOADMSHMESH_AND_ALLDATA(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_loadSol | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solution structure.. |
filename | name of the solution file. |
Load metric field. The file at medit file format must contains 1 solution: the metric.
SUBROUTINE MMG2D_LOADSOL(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
mesh | pointer toward the mesh structure. |
met | pointer toward the sol structure. |
filename | name of file. |
Load metric field.
Read the file header
int MMG2D_loadVect | ( | MMG5_pMesh | , |
char * | |||
) |
int MMG2D_mmg2dlib | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward a sol structure (metric). |
Main program for the mesh adaptation library .
SUBROUTINE MMG2D_MMG2DLIB(mesh,sol,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_mmg2dls | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward a sol structure (metric). |
Main program for the level-set discretization library .
SUBROUTINE MMG2D_MMG2DLS(mesh,sol,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_mmg2dmesh | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward a sol structure (metric). |
Main program for the mesh generation library .
SUBROUTINE MMG2D_MMG2DMESH(mesh,sol,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_mmg2dmov | ( | MMG5_pMesh | mesh, |
MMG5_pSol | met, | ||
MMG5_pSol | disp | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward a sol structure (displacement). |
disp | pointer toward a sol (displacement for the lagrangian motion mode) structure. |
Main program for the rigid body movement library .
SUBROUTINE MMG2D_MMG2DMOV(mesh,sol,disp,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol,disp
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
void MMG2D_Reset_verticestags | ( | MMG5_pMesh | mesh | ) |
mesh | pointer toward the mesh structure |
Reset the vertices tag (be careful all the tags are deleted).
SUBROUTINE MMG2D_RESET_VERTICESTAGS(mesh)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
END SUBROUTINE
int MMG2D_saveAllSols | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solutions array |
filename | name of the solution file. |
Save 1 or more solutions in a solution file at medit file format.
SUBROUTINE MMG2D_SAVEALLSOLS(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
mesh | pointer toward the mesh structure. |
sol | pointer toward the solutions array. |
filename | name of file. |
Write 1 or more solutions.
int MMG2D_saveMesh | ( | MMG5_pMesh | , |
const char * | |||
) |
mesh | pointer toward the mesh structure. |
filename | name of the readed file. |
Save mesh data.
SUBROUTINE MMG2D_SAVEMESH(mesh,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_saveMshMesh | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solution structure. |
filename | name of file. |
Write mesh and 0 or 1 data at MSH file format (.msh extension). Save file at ASCII format for .msh extension, at binary format for .msh one.
SUBROUTINE MMG2D_SAVEMSHMESH(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_saveMshMesh_and_allData | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solution structure. |
filename | name of file. |
Write mesh and a list of data fields at MSH file format (.msh extension). Save file at ASCII format for .msh extension, at binary format for .mshb one.
SUBROUTINE MMG2D_SAVEMSHMESH_AND_ALLDATA(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_saveSol | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | filename | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the solution structure.. |
filename | name of the solution file. |
Save metric field at medit solution file format.
SUBROUTINE MMG2D_SAVESOL(mesh,sol,filename,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: filename
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
mesh | pointer toward the mesh structure. |
met | pointer toward the sol structure. |
filename | name of file. |
Write isotropic or anisotropic metric.
int MMG2D_saveVect | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | filename, | ||
double | lambda | ||
) |
int MMG2D_Set_constantSize | ( | MMG5_pMesh | mesh, |
MMG5_pSol | met | ||
) |
mesh | pointer toward the mesh structure |
met | pointer toward the sol structure |
Compute constant size map according to mesh->info.hsiz, mesh->info.hmin and mesh->info.hmax. Update this 3 value if not compatible.
SUBROUTINE MMG2D_SET_CONSTANTSIZE(mesh,met,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,met
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_corner | ( | MMG5_pMesh | mesh, |
int | k | ||
) |
mesh | pointer toward the mesh structure. |
k | vertex index. |
Set corner at point pos.
SUBROUTINE MMG2D_SET_CORNER(mesh,k,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: k
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_dparameter | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
int | dparam, | ||
double | val | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
dparam | double parameter to set (see MMG2D_Param structure). |
val | value of the parameter. |
Set double parameter dparam at value val.
SUBROUTINE MMG2D_SET_DPARAMETER(mesh,sol,dparam,val,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(IN) :: dparam
REAL(KIND=8), INTENT(IN) :: val
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_edge | ( | MMG5_pMesh | mesh, |
int | v0, | ||
int | v1, | ||
int | ref, | ||
int | pos | ||
) |
mesh | pointer toward the mesh structure. |
v0 | first vertex of edge. |
v1 | second vertex of edge. |
ref | edge reference. |
pos | edge position in the mesh. |
Set edge of vertices v0, v1 and reference ref at position pos in mesh structure.
SUBROUTINE MMG2D_SET_EDGE(mesh,v0,v1,ref,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: v0,v1,ref,pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_edges | ( | MMG5_pMesh | mesh, |
int * | edges, | ||
int * | refs | ||
) |
mesh | pointer toward the mesh structure. |
edges | pointer toward the array of edges. Vertices of the ![]() |
refs | edges references. refs[i-1] is the ref of the ![]() |
Set vertices and references of the mesh edges.
SUBROUTINE MMG2D_SET_EDGES(mesh,edges,refs,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: edges(*),refs(*)
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_inputMeshName | ( | MMG5_pMesh | mesh, |
const char * | meshin | ||
) |
mesh | pointer toward the mesh structure. |
meshin | input mesh name. |
Set the name of input mesh.
SUBROUTINE MMG2D_SET_INPUTMESHNAME(mesh,meshin,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
CHARACTER(LEN=*), INTENT(IN) :: meshin
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_inputSolName | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | solin | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
solin | name of the input solution file. |
Set the name of input solution file.
SUBROUTINE MMG2D_SET_INPUTSOLNAME(mesh,sol,solin,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: solin
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_iparameter | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
int | iparam, | ||
int | val | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
iparam | integer parameter to set (see MMG2D_Param structure). |
val | value for the parameter. |
Set integer parameter iparam at value val.
SUBROUTINE MMG2D_SET_IPARAMETER(mesh,sol,iparam,val,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(IN) :: iparam,val
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_ithSol_inSolsAtVertices | ( | MMG5_pSol | sol, |
int | i, | ||
double * | s, | ||
int | pos | ||
) |
sol | pointer toward the array of solutions |
i | position of the solution field that we want to set. |
s | solution(s) at mesh vertex pos. |
pos | index of the vertex on which we set the solution. |
Set values of the solution at the ith field of the solution array.
SUBROUTINE MMG2D_SET_ITHSOL_INSOLSATVERTICES(sol,i,s,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: sol
INTEGER, INTENT(IN) :: i,pos
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_ithSols_inSolsAtVertices | ( | MMG5_pSol | sol, |
int | i, | ||
double * | s | ||
) |
sol | pointer toward the array of solutions |
i | position of the solution field that we want to set. |
s | table of the solutions at mesh vertices. The solution at vertex k is given by s[k-1] for a scalar sol, s[2*(k-1)]@2 for a vectorial solution and s[3*(k-1)]@3 for a tensor solution. |
Set values of the solution at the ith field of the solution array.
SUBROUTINE MMG2D_SET_ITHSOLS_INSOLSATVERTICES(sol,i,s,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: sol
INTEGER, INTENT(IN) :: i
REAL(KIND=8), DIMENSION(*),INTENT(OUT) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_meshSize | ( | MMG5_pMesh | mesh, |
int | np, | ||
int | nt, | ||
int | na | ||
) |
mesh | pointer toward the mesh structure. |
np | number of vertices. |
nt | number of triangles. |
na | number of edges. |
Set the number of vertices, tetrahedra, triangles and edges of the mesh and allocate the associated tables. If call twice, reset the whole mesh to realloc it at the new size
SUBROUTINE MMG2D_SET_MESHSIZE(mesh,np,nt,na,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER :: np,nt,na
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_outputMeshName | ( | MMG5_pMesh | mesh, |
const char * | meshout | ||
) |
mesh | pointer toward the mesh structure. |
meshout | name of the output mesh file. |
Set the name of output mesh file.
SUBROUTINE MMG2D_SET_OUTPUTMESHNAME(mesh,meshout,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh
CHARACTER(LEN=*), INTENT(IN) :: meshout
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_outputSolName | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
const char * | solout | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
solout | name of the output solution file. |
Set the name of output solution file.
SUBROUTINE MMG2D_SET_OUTPUTSOLNAME(mesh,sol,solout,strlen0,retval)
MMG5_DATA_PTR_T, INTENT(INOUT) :: mesh,sol
CHARACTER(LEN=*), INTENT(IN) :: solout
INTEGER, INTENT(IN) :: strlen0
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_parallelEdge | ( | MMG5_pMesh | mesh, |
int | k | ||
) |
mesh | pointer toward the mesh structure. |
k | edge index. |
Set edge k as parallel.
SUBROUTINE MMG2D_SET_PARALLELEDGE(mesh,k,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: k
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_requiredEdge | ( | MMG5_pMesh | mesh, |
int | k | ||
) |
mesh | pointer toward the mesh structure. |
k | edge index. |
Set edge k as required.
SUBROUTINE MMG2D_SET_REQUIREDEDGE(mesh,k,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: k
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_requiredTriangle | ( | MMG5_pMesh | mesh, |
int | k | ||
) |
mesh | pointer toward the mesh structure. |
k | triangle index. |
Set triangle k as required.
int MMG2D_Set_requiredVertex | ( | MMG5_pMesh | mesh, |
int | k | ||
) |
mesh | pointer toward the mesh structure. |
k | vertex index. |
Set point k as required.
SUBROUTINE MMG2D_SET_REQUIREDVERTEX(mesh,k,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: k
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_scalarSol | ( | MMG5_pSol | met, |
double | s, | ||
int | pos | ||
) |
met | pointer toward the sol structure. |
s | solution scalar value. |
pos | position of the solution in the mesh. |
Set scalar value s at position pos in solution structure
SUBROUTINE MMG2D_SET_SCALARSOL(met,s,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(IN) :: s
INTEGER, INTENT(IN) :: pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_scalarSols | ( | MMG5_pSol | met, |
double * | s | ||
) |
met | pointer toward the sol structure. |
s | table of the scalar solutions values. s[i-1] is the solution at vertex i. |
Set scalar solutions at mesh vertices.
SUBROUTINE MMG2D_SET_SCALARSOLS(met,s,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8),DIMENSION(*), INTENT(IN) :: s
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_solsAtVerticesSize | ( | MMG5_pMesh | mesh, |
MMG5_pSol * | sol, | ||
int | nsols, | ||
int | nentities, | ||
int * | typSol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward an allocatable sol structure. |
nsols | number of solutions per entity |
nentities | number of entities |
typSol | Array of size nsol listing the type of the solutions (scalar, vectorial...). |
Set the solution number, dimension and type.
SUBROUTINE MMG2D_SET_SOLSATVERTICESSIZE(mesh,sol,nsols,nentities,typSol,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(IN) :: nsols,nentities
INTEGER, INTENT(IN) :: typSol(*)
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
Sol tab allocation
int MMG2D_Set_solSize | ( | MMG5_pMesh | mesh, |
MMG5_pSol | sol, | ||
int | typEntity, | ||
int | np, | ||
int | typSol | ||
) |
mesh | pointer toward the mesh structure. |
sol | pointer toward the sol structure. |
typEntity | type of solutions entities (vertices, triangles...). |
np | number of solutions. |
typSol | type of solution (scalar, vectorial...). |
Set the solution number, dimension and type.
SUBROUTINE MMG2D_SET_SOLSIZE(mesh,sol,typEntity,np,typSol,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh,sol
INTEGER, INTENT(IN) :: typEntity,np,typSol
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_tensorSol | ( | MMG5_pSol | met, |
double | m11, | ||
double | m12, | ||
double | m22, | ||
int | pos | ||
) |
met | pointer toward the sol structure. |
m11 | value at position (1,1) in the solution tensor. |
m12 | value at position (1,2) in the solution tensor. |
m22 | value at position (2,2) in the solution tensor. |
pos | position of the solution in the mesh. |
Set tensor value s at position pos in solution structure
SUBROUTINE MMG2D_SET_TENSORSOL(met,m11,m12,m22,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(IN) :: m11,m12,m22
INTEGER, INTENT(IN) :: pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_tensorSols | ( | MMG5_pSol | met, |
double * | sols | ||
) |
met | pointer toward the sol structure. |
sols | table of the tensorial solutions. sols[3*(i-1)]@3 is the solution at vertex i |
Set tensorial values at position pos in solution structure.
SUBROUTINE MMG2D_SET_TENSORSOLS(met,sols,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8),DIMENSION(*), INTENT(IN) :: sols
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_triangle | ( | MMG5_pMesh | mesh, |
int | v0, | ||
int | v1, | ||
int | v2, | ||
int | ref, | ||
int | pos | ||
) |
mesh | pointer toward the mesh structure. |
v0 | first vertex of triangle. |
v1 | second vertex of triangle. |
v2 | third vertex of triangle. |
ref | triangle reference. |
pos | triangle position in the mesh. |
Set triangle of vertices v0, v1, v2 and reference ref at position pos in mesh structure.
SUBROUTINE MMG2D_SET_TRIANGLE(mesh,v0,v1,v2,ref,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
INTEGER, INTENT(IN) :: v0,v1,v2,ref,pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_triangles | ( | MMG5_pMesh | mesh, |
int * | tria, | ||
int * | refs | ||
) |
mesh | pointer toward the mesh structure. |
tria | pointer toward the table of the tria vertices. Vertices of the ![]() |
refs | pointer toward the table of the triangle references. refs[i-1] is the ref of the ![]() |
Set vertices and references of the mesh triangles.
! SUBROUTINE MMG2D_SET_TRIANGLES(mesh,tria,refs,retval)
! MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
! INTEGER,DIMENSION(*), INTENT(IN) :: tria,refs
! INTEGER, INTENT(OUT) :: retval
! END SUBROUTINE
int MMG2D_Set_vectorSol | ( | MMG5_pSol | met, |
double | vx, | ||
double | vy, | ||
int | pos | ||
) |
met | pointer toward the sol structure. |
vx | x value of the vectorial solution. |
vy | y value of the vectorial solution. |
pos | position of the solution in the mesh (begin to 1). |
Set vectorial value at position pos in solution structure.
SUBROUTINE MMG2D_SET_VECTORSOL(met,vx,vy,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8), INTENT(IN) :: vx,vy
INTEGER, INTENT(IN) :: pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_vectorSols | ( | MMG5_pSol | met, |
double * | sols | ||
) |
met | pointer toward the sol structure. |
sols | table of the vectorial solutions sols[2*(i-1)]@2 is the solution at vertex i |
Set vectorial solutions at mesh vertices
SUBROUTINE MMG2D_SET_VECTORSOLS(met,sols,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: met
REAL(KIND=8),DIMENSION(*), INTENT(IN) :: sols
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_vertex | ( | MMG5_pMesh | mesh, |
double | c0, | ||
double | c1, | ||
int | ref, | ||
int | pos | ||
) |
mesh | pointer toward the mesh structure. |
c0 | coordinate of the point along the first dimension. |
c1 | coordinate of the point along the second dimension. |
ref | point reference. |
pos | position of the point in the mesh. |
Set vertex of coordinates c0, c1 and reference ref at position pos in mesh structure
SUBROUTINE MMG2D_SET_VERTEX(mesh,c0,c1,ref,pos,retval)
MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
REAL(KIND=8), INTENT(IN) :: c0,c1
INTEGER, INTENT(IN) :: ref,pos
INTEGER, INTENT(OUT) :: retval
END SUBROUTINE
int MMG2D_Set_vertices | ( | MMG5_pMesh | mesh, |
double * | vertices, | ||
int * | refs | ||
) |
mesh | pointer toward the mesh structure. |
vertices | table of the points coor. The coordinates of the ![]() |
refs | table of points references. The ref of the ![]() |
Set vertices coordinates and references in mesh structure
! SUBROUTINE MMG2D_SET_VERTICES(mesh,vertices,refs,retval)
! MMG5_DATA_PTR_T,INTENT(INOUT) :: mesh
! REAL(KIND=8), DIMENSION(*),INTENT(IN) :: vertices
! INTEGER,DIMENSION(*), INTENT(IN) :: refs
! INTEGER, INTENT(OUT) :: retval
! END SUBROUTINE
void MMG2D_setfunc | ( | MMG5_pMesh | mesh, |
MMG5_pSol | met | ||
) |
mesh | pointer toward the mesh structure. |
met | pointer toward a sol structure. |
Set function pointers for length, caltri... depending if case is iso or aniso
SUBROUTINE MMG2D_SETFUNC(mesh,met)
MMG5_DATA_PTR_T, INTENT(IN) :: mesh,met
END SUBROUTINE