Home
last modified time | relevance | path

Searched refs:map_out (Results 1 – 25 of 122) sorted by relevance

12345

/dports/science/healpix/Healpix_3.50/src/f90/mod/
H A Dudgrade_template.f9064 REAL(KMAP), INTENT(OUT), DIMENSION(0:) :: map_out local
85 map_out(ip) = bad_value
112 if (nobs > 0) map_out(id) = total/nobs
125 map_out(iu) = map_in(ip)
193 call convert_nest2ring(nside_out, map_out)
218 nd_out = long_size(map_out,2)
239 p_out => map_out(0:npix_out-1, id)
242 call convert_nest2ring(nside_out, map_out)
278 REAL(KMAP), INTENT(OUT), dimension(0:) :: map_out local
321 nd_out = long_size(map_out,2)
[all …]
/dports/science/healpix/Healpix_3.50/src/idl/toolkit/
H A Dud_grade.pro104 ; return, map_out
143 if nbad gt 0 then map_out[bad] = bad_data
163 return,map_out
191 ; map_out : upgraded or degraded map
267 dtype_out = size(/tname,map_out)
443 map_out = map_in
449map_out = sub_ud_grade(map_out, nside_in, nside_out, bad_data=bad_data, pessimistic=pessimistic)
450 map_out = reorder(map_out,in='NEST',out=ord_out)
453map_out = sub_ud_grade(map_out, nside_in, nside_out, bad_data=bad_data, pessimistic=pessimistic)
455 ; map_out = prograde_qu( map_out, nside_in, nside_out)
[all …]
H A Dreorder.pro40 ; map_out = reorder(map_in, [in=in, out=out, /n2r, /r2n, /help])
57 ; map_out : a reordered full sky Healpix map,
93 print,' map_out = reorder(map_in, [In=in, Out=out,] [/R2N, /N2R], [/HELP])'
116 print,' map_out = reorder(map_in, In=in, Out=out)'
122 print,' map_out = reorder(map_in, In=in, Out=out)'
139 map_out = make_array(np, ncol, type=size(/type,map_in))
144 for ic=0,ncol-1 do map_out[ipn,ic] = map_in[ipr,ic]
151 for ic=0,ncol-1 do map_out[ipr,ic] = map_in[ipn,ic]
156 return, map_out
/dports/science/nwchem/nwchem-7b21660b82ebd85ef659f6fba7e1e73433b0bd0a/src/peigs/src/c/
H A Dde_sym.c93 Integer *mapvec, *map_out, *proclist; local
165 map_out = iscrat;
173 nvecs_out = fil_mapvec_( &idest, &n, map, map_out );
183 lenb =un_load_size(nvecs, mapvec, nvecs_out, map_out);
187 un_load(nvecs, mapvec, nvecs_out, map_out, matrix2, read_buffer);
192 nvecs_out = fil_mapvec_ ( &idest, &n, map, map_out );
193 lenb =un_load_size(nvecs, mapvec, nvecs_out, map_out);
197 un_load(nvecs, mapvec, nvecs_out, map_out, matrix2, read_buffer);
222 Integer load_up(nvecs, mapvec, nvecs_out, map_out, matrix, buffer) in load_up() argument
223 Integer nvecs, *mapvec, nvecs_out, *map_out; in load_up()
[all …]
/dports/science/nwchem-data/nwchem-7.0.2-release/src/peigs/src/c/
H A Dde_sym.c93 Integer *mapvec, *map_out, *proclist; local
165 map_out = iscrat;
173 nvecs_out = fil_mapvec_( &idest, &n, map, map_out );
183 lenb =un_load_size(nvecs, mapvec, nvecs_out, map_out);
187 un_load(nvecs, mapvec, nvecs_out, map_out, matrix2, read_buffer);
192 nvecs_out = fil_mapvec_ ( &idest, &n, map, map_out );
193 lenb =un_load_size(nvecs, mapvec, nvecs_out, map_out);
197 un_load(nvecs, mapvec, nvecs_out, map_out, matrix2, read_buffer);
222 Integer load_up(nvecs, mapvec, nvecs_out, map_out, matrix, buffer) in load_up() argument
223 Integer nvecs, *mapvec, nvecs_out, *map_out; in load_up()
[all …]
/dports/mail/cyrus-imapd32/cyrus-imapd-3.2.8/imap/
H A Dsmmapd.c108 static struct protstream *map_in, *map_out; variable
129 if (map_out) { in smmapd_reset()
131 prot_flush(map_out); in smmapd_reset()
132 prot_free(map_out); in smmapd_reset()
137 map_in = map_out = NULL; in smmapd_reset()
206 map_out = prot_new(1, 1); in service_main()
207 prot_setflushonread(map_in, map_out); in service_main()
330 prot_printf(map_out, "%s", buf); in verify_user()
419 prot_printf(map_out, SIZE_T_FMT ":NOTFOUND %s,", in begin_handling()
437 prot_printf(map_out, SIZE_T_FMT ":PERM %s (%s),", in begin_handling()
[all …]
/dports/mail/cyrus-imapd34/cyrus-imapd-3.4.2/imap/
H A Dsmmapd.c108 static struct protstream *map_in, *map_out; variable
129 if (map_out) { in smmapd_reset()
131 prot_flush(map_out); in smmapd_reset()
132 prot_free(map_out); in smmapd_reset()
137 map_in = map_out = NULL; in smmapd_reset()
206 map_out = prot_new(1, 1); in service_main()
207 prot_setflushonread(map_in, map_out); in service_main()
330 prot_printf(map_out, "%s", buf); in verify_user()
419 prot_printf(map_out, SIZE_T_FMT ":NOTFOUND %s,", in begin_handling()
437 prot_printf(map_out, SIZE_T_FMT ":PERM %s (%s),", in begin_handling()
[all …]
/dports/mail/cyrus-imapd30/cyrus-imapd-3.0.16/imap/
H A Dsmmapd.c109 static struct protstream *map_in, *map_out; variable
130 if (map_out) { in smmapd_reset()
132 prot_flush(map_out); in smmapd_reset()
133 prot_free(map_out); in smmapd_reset()
138 map_in = map_out = NULL; in smmapd_reset()
226 map_out = prot_new(1, 1); in service_main()
227 prot_setflushonread(map_in, map_out); in service_main()
350 prot_printf(map_out, "%s", buf); in verify_user()
439 prot_printf(map_out, SIZE_T_FMT ":NOTFOUND %s,", in begin_handling()
457 prot_printf(map_out, SIZE_T_FMT ":PERM %s (%s),", in begin_handling()
[all …]
/dports/science/afni/afni-AFNI_21.3.16/src/
H A Dthd_warps.c268 THD_linear_mapping * map_out ; in AFNI_concatenate_lmap() local
273 map_out = myRwcNew(THD_linear_mapping) ; in AFNI_concatenate_lmap()
274 map_out->type = MAPPING_LINEAR_TYPE ; in AFNI_concatenate_lmap()
278 map_out->mfor = MAT_MUL( map_2->mfor , map_1->mfor ) ; in AFNI_concatenate_lmap()
279 map_out->mbac = MAT_INV( map_out->mfor ) ; in AFNI_concatenate_lmap()
284 map_out->bvec = ADD_FVEC3( tvec , map_2->bvec ) ; in AFNI_concatenate_lmap()
285 map_out->svec = MATVEC( map_out->mbac , map_out->bvec ) ; in AFNI_concatenate_lmap()
286 NEGATE_FVEC3(map_out->svec) ; in AFNI_concatenate_lmap()
288 map_out->bot = map_2->bot ; in AFNI_concatenate_lmap()
289 map_out->top = map_2->top ; in AFNI_concatenate_lmap()
[all …]
/dports/science/healpix/Healpix_3.50/src/idl/visu/
H A Dproj2map_out.pro41 map_out = planmap
55 bad_pixels = where(abs(map_out/my_bad_data - 1.) lt 1.e-5, nbad_pixels)
56 if (nbad_pixels gt 0) then map_out[bad_pixels] = !values.f_nan
59 if defined(offmap) then map_out[offmap] = !values.f_nan
69 bad_pixels = where(finite(map_out,/nan), nbad_pixels)
70 if (nbad_pixels gt 0) then map_out[bad_pixels] = my_bad_data
73 if defined(offmap) then map_out[offmap] = my_bad_data
78 return, map_out
/dports/science/octopus/octopus-10.5/src/grid/
H A Dpartition_transfer.F9075 type(iihash_t) :: map_out local
153 call iihash_init(map_out)
157 call iihash_insert(map_out, part_map(ipart, ip), ipart)
160 call iihash_insert(map_out, part_map(ipart, mycolumn), part_map(ipart, mycolumn))
167 opart = iihash_lookup(map_out, irec, found)
183 opart = iihash_lookup(map_out, irec, found)
199 call iihash_end(map_out)
/dports/databases/grass7/grass-7.8.6/raster/r.spread/
H A Dspread.c51 extern float *map_out;
157 DATA(map_out, row, col) = (float)BARRIER; in spread()
257 if (DATA(map_out, row, col) < -1.0) { in update()
259 DATA(map_out, row, col), min_cost); in update()
260 DATA(map_out, row, col) = min_cost; in update()
273 if (DATA(map_out, row, col) > min_cost + 0.001) { in update()
275 DATA(map_out, row, col), min_cost); in update()
276 DATA(map_out, row, col) = min_cost; in update()
H A Dcollect_ori.c56 extern float *map_out; in collect_ori()
81 DATA(map_out, row, col) = cell[col]; in collect_ori()
83 DATA(map_out, row, col) = (float)init_time; in collect_ori()
99 DATA(map_out, row, col) = neg; in collect_ori()
/dports/math/pspp/pspp-1.4.1/src/language/xforms/
H A Drecode.c68 struct map_out struct
80 struct map_out out; /* Output value. */ argument
124 static void set_map_out_num (struct map_out *, double);
232 struct map_out out; in parse_mappings()
430 set_map_out_num (struct map_out *out, double value) in set_map_out_num()
560 struct map_out *out = &trns->mappings[i].out; in enlarge_dst_widths()
601 static const struct map_out *
609 const struct map_out *out = &m->out; in find_src_numeric()
642 static const struct map_out *
653 struct map_out *out = &m->out; in find_src_string()
[all …]
/dports/science/healpix/Healpix_3.50/src/f90/ud_grade/
H A Dudg_sub_inc.f9050 REAL(KMAP), DIMENSION(:,:), ALLOCATABLE :: map_out variable
162 ALLOCATE(map_out(0:npix_out-1,1:nmaps),stat = status)
189 call udgrade_ring(map_in , nside_in, map_out, nside_out)
191 call udgrade_nest(map_in , nside_in, map_out, nside_out)
239 call write_bintab(map_out, npix_out, nmaps, header, nlheader, outfile)
245 DEALLOCATE(map_out)
/dports/databases/grass7/grass-7.8.6/vector/v.net.spanningtree/
H A Dmain.c32 struct Option *map_in, *map_out; in main() local
54 map_out = G_define_standard_option(G_OPT_V_OUTPUT); in main()
95 Vect_check_input_output_name(map_in->answer, map_out->answer, in main()
105 if (0 > Vect_open_new(&Out, map_out->answer, with_z)) { in main()
107 G_fatal_error(_("Unable to create vector map <%s>"), map_out->answer); in main()
/dports/databases/grass7/grass-7.8.6/vector/v.net.bridge/
H A Dmain.c32 struct Option *map_in, *map_out; in main() local
55 map_out = G_define_standard_option(G_OPT_V_OUTPUT); in main()
112 Vect_check_input_output_name(map_in->answer, map_out->answer, in main()
122 if (0 > Vect_open_new(&Out, map_out->answer, with_z)) { in main()
124 G_fatal_error(_("Unable to create vector map <%s>"), map_out->answer); in main()
/dports/science/healpix/Healpix_3.50/src/idl/interfaces/
H A Disynfast.pro28 pro isynfast, cl_in, map_out $
63 ; isynfast, cl_in [, map_out,
76 ; map_out : map synthetised from the power spectrum or from constraining alm
163 ; May 2008, v1.1.3 (post beta release): bug correction for map_out
164 ; 2008-08-27, v1.1.3 (post 2.10 release): do not try to read map_out in
169 syntax = [local.routine+', cl_in [, map_out, ', $
192 print,local.routine+': Should provide some output: map_out or alm_out'
205 ;if (~arg_present(map_out)) then map_out = NoFile
211 tmp_map_out = hpx_mem2file(with_map_out ? (defined(map_out)?map_out :-1) : NoFile, /out)
250 if (with_map_out) then hpx_file2mem, tmp_map_out, map_out,/map ; 2008-08-27
/dports/converters/p5-Unicode-Map8/Unicode-Map8-0.13/
H A Dmake_rfc1345_maps39 map_out();
78 map_out();
89 sub map_out
/dports/multimedia/mpv/mpv-0.34.1/filters/
H A Df_swresample.c206 struct mp_chmap map_out = p->out_channels; in configure_lavrr() local
212 mp_chmap_equals(&map_in, &map_out)) in configure_lavrr()
215 mp_chmap_set_unknown(&map_out, map_out.num); in configure_lavrr()
220 uint64_t out_ch_layout = mp_chmap_to_lavc_unchecked(&map_out); in configure_lavrr()
241 if (mp_chmap_equals(&out_lavc, &map_out)) { in configure_lavrr()
247 mp_chmap_fill_na(&withna, map_out.num); in configure_lavrr()
248 if (withna.num != map_out.num) in configure_lavrr()
251 mp_chmap_get_reorder(p->reorder_out, &out_lavc, &map_out); in configure_lavrr()
269 if (map_out.num > out_lavc.num) in configure_lavrr()
270 mp_aframe_set_chmap(p->pool_fmt, &map_out); in configure_lavrr()
[all …]
/dports/net/storj/storj-1.45.3/vendor/github.com/apache/thrift/lib/c_glib/test/
H A Dtestthrifttestclient.cpp366 GHashTable *map_in = NULL, *map_out = NULL; in test_thrift_client() local
451 map_out = g_hash_table_new (NULL, NULL); in test_thrift_client()
452 map_in = g_hash_table_new (NULL, NULL); g_hash_table_insert (map_out, &i32, &i32); in test_thrift_client()
453 assert (t_test_thrift_test_client_test_map (iface, &map_in, map_out, &error) == TRUE); in test_thrift_client()
455 g_hash_table_destroy (map_out); in test_thrift_client()
458 map_out = g_hash_table_new (NULL, NULL); in test_thrift_client()
460 g_hash_table_insert (map_out, g_strdup ("a"), g_strdup ("123")); in test_thrift_client()
461 g_hash_table_insert (map_out, g_strdup ("a b"), g_strdup ("with spaces ")); in test_thrift_client()
462 g_hash_table_insert (map_out, g_strdup ("same"), g_strdup ("same")); in test_thrift_client()
463 g_hash_table_insert (map_out, g_strdup ("0"), g_strdup ("numeric key")); in test_thrift_client()
[all …]
/dports/www/fabio/fabio-1.5.14/vendor/github.com/apache/thrift/thrift-da1169d75b15/lib/c_glib/test/
H A Dtestthrifttestclient.cpp366 GHashTable *map_in = NULL, *map_out = NULL; in test_thrift_client() local
451 map_out = g_hash_table_new (NULL, NULL); in test_thrift_client()
452 map_in = g_hash_table_new (NULL, NULL); g_hash_table_insert (map_out, &i32, &i32); in test_thrift_client()
453 assert (t_test_thrift_test_client_test_map (iface, &map_in, map_out, &error) == TRUE); in test_thrift_client()
455 g_hash_table_destroy (map_out); in test_thrift_client()
458 map_out = g_hash_table_new (NULL, NULL); in test_thrift_client()
460 g_hash_table_insert (map_out, g_strdup ("a"), g_strdup ("123")); in test_thrift_client()
461 g_hash_table_insert (map_out, g_strdup ("a b"), g_strdup ("with spaces ")); in test_thrift_client()
462 g_hash_table_insert (map_out, g_strdup ("same"), g_strdup ("same")); in test_thrift_client()
463 g_hash_table_insert (map_out, g_strdup ("0"), g_strdup ("numeric key")); in test_thrift_client()
[all …]
/dports/databases/grass7/grass-7.8.6/vector/v.net.connectivity/
H A Dmain.c33 struct Option *map_in, *map_out; in main() local
86 map_out = G_define_standard_option(G_OPT_V_OUTPUT); in main()
124 Vect_check_input_output_name(map_in->answer, map_out->answer, in main()
134 if (0 > Vect_open_new(&Out, map_out->answer, with_z)) { in main()
136 G_fatal_error(_("Unable to create vector map <%s>"), map_out->answer); in main()
/dports/databases/grass7/grass-7.8.6/vector/v.delaunay/
H A Din_out.h7 struct Map_info *map_out);
9 struct Map_info *map_out);
/dports/www/grafana8/grafana-8.3.6/vendor/github.com/apache/thrift/test/c_glib/src/
H A Dtest_client.c320 GHashTable *map_out, *map_in, *inner_map_in; in main() local
787 map_out = g_hash_table_new_full (g_int_hash, in main()
802 g_hash_table_iter_init (&hash_table_iter, map_out); in main()
822 map_out, in main()
864 g_hash_table_unref (map_out); in main()
869 map_out = g_hash_table_new_full (g_str_hash, in main()
873 g_hash_table_insert (map_out, "a", "2"); in main()
874 g_hash_table_insert (map_out, "b", "blah"); in main()
875 g_hash_table_insert (map_out, "some", "thing"); in main()
878 g_hash_table_iter_init (&hash_table_iter, map_out); in main()
[all …]

12345