OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
radioss0.F File Reference
#include "implicit_f.inc"
#include "chara_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine radioss0

Function/Subroutine Documentation

◆ radioss0()

subroutine radioss0

Definition at line 37 of file radioss0.F.

38C-----------------------------------------------
39C M o d u l e s
40C-----------------------------------------------
42 USE dynlib_mod
43C-----------------------------------------------
44C I m p l i c i t T y p e s
45C-----------------------------------------------
46#include "implicit_f.inc"
47C-----------------------------------------------
48C C o m m o n B l o c k s
49C-----------------------------------------------
50#include "chara_c.inc"
51C-----------------------------------------------
52C L o c a l V a r i a b l e s
53C-----------------------------------------------
54 INTEGER MRDATA, MIDATA,IO_ERR,FVERS
55 parameter(mrdata=3,midata=9)
56 INTEGER, DIMENSION(:),ALLOCATABLE :: IDATA
58 + , DIMENSION(:),ALLOCATABLE :: rdata
59 INTEGER I
60 CHARACTER FNAME*2048
61 INTEGER LFNAME
62 INTEGER DUM_IERR
63 INTEGER :: DYN_LIB_MODE
64C-----------------------------------------------
65C attention IBM/MPI ne supporte pas de REWIND sur STDIN !
66C La lecture du fichier D01 pour detection de l'option /MADYMO/ON
67C n'est pas autorisee en SPMD.
68C => A modifier si cette option doit etre supportee en SPMD ../..
69C { attention IBM/MPI does not support REWIND on STDIN !
70C Reading the D01 file for detection of the /MADYMO/ON option
71C is not authorized in SPMD.
72C => To be modified if this option must be supported in SPMD ../.. }
73 INTEGER ISTDI
74 CHARACTER KEYA*80
75C----------------------------------------------
76C Parametres argument de run { Run argument parameters }
77 CALL file_init() ! Initialize C FILE buffer for IEEE writing
78
79C
80 ALLOCATE( dlib_struct(nbr_dlib) )
81 dyn_lib_mode = 0
82 CALL init_dyn_lib_struc(dyn_lib_mode)
83 CALL execargcheck(got_input, input, leninput,
84 * got_path, path, lenpath )
85
86! ----------------------------
87! if -infile or outfile cdl are used, then one needs to change $TMPDIR
88! in order to write all scratch files in the user folder
90! ----------------------------
91C-----------------------------------------------
92C allocation minimale (en cas d'absence de couplage MADYMO).
93C { minimum allocation (in the absence of MADYMO coupling) }
94 ALLOCATE(idata(midata))
95 ALLOCATE(rdata(mrdata))
96 DO i=1,midata
97 idata(i)=0
98 ENDDO
99 DO i=1,mrdata
100 rdata(i)=zero
101 ENDDO
102C-----------------------------------------------
103 CALL radioss2(idata, midata, rdata, mrdata)
104C-----------------------------------------------
1059999 CONTINUE
106 RETURN
#define my_real
Definition cppsort.cpp:32
type(dyn_lib_type), dimension(:), allocatable dlib_struct
Definition dynlib_mod.F:72
subroutine init_dyn_lib_struc(mode)
Definition dynlib_mod.F:97
integer, parameter nbr_dlib
Definition dynlib_mod.F:63
character(len=outfile_char_len) outfile_name
integer outfile_name_len
subroutine radioss2(idata, midata, rdata, mrdata)
Definition radioss2.F:143
void radioss_set_env_variable(char *variable, char *value, int *len_value)
subroutine execargcheck(output)
void file_init()