Line data Source code
1 : ! ***********************************************************************
2 : !
3 : ! Copyright (C) 2014 The MESA Team
4 : !
5 : ! This program is free software: you can redistribute it and/or modify
6 : ! it under the terms of the GNU Lesser General Public License
7 : ! as published by the Free Software Foundation,
8 : ! either version 3 of the License, or (at your option) any later version.
9 : !
10 : ! This program is distributed in the hope that it will be useful,
11 : ! but WITHOUT ANY WARRANTY; without even the implied warranty of
12 : ! MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.
13 : ! See the GNU Lesser General Public License for more details.
14 : !
15 : ! You should have received a copy of the GNU Lesser General Public License
16 : ! along with this program. If not, see <https://www.gnu.org/licenses/>.
17 : !
18 : ! ***********************************************************************
19 :
20 : module pgstar_r_l
21 :
22 : use star_private_def
23 : use const_def, only: dp
24 : use pgstar_support
25 : use star_pgstar
26 :
27 : implicit none
28 :
29 : contains
30 :
31 0 : subroutine R_L_Plot(id, device_id, ierr)
32 : integer, intent(in) :: id, device_id
33 : integer, intent(out) :: ierr
34 : type (star_info), pointer :: s
35 : ierr = 0
36 0 : call get_star_ptr(id, s, ierr)
37 0 : if (ierr /= 0) return
38 :
39 0 : call pgslct(device_id)
40 0 : call pgbbuf()
41 0 : call pgeras()
42 :
43 : call do_R_L_Plot(s, id, device_id, &
44 : s% pg% R_L_xleft, s% pg% R_L_xright, &
45 : s% pg% R_L_ybot, s% pg% R_L_ytop, .false., &
46 0 : s% pg% R_L_title, s% pg% R_L_txt_scale, ierr)
47 0 : if (ierr /= 0) return
48 :
49 0 : call pgebuf()
50 :
51 : end subroutine R_L_Plot
52 :
53 :
54 0 : subroutine do_R_L_Plot(s, id, device_id, &
55 : xleft, xright, ybot, ytop, subplot, &
56 : title, txt_scale, ierr)
57 : use pgstar_hist_track, only: null_decorate, do_Hist_Track
58 : type (star_info), pointer :: s
59 : integer, intent(in) :: id, device_id
60 : real, intent(in) :: xleft, xright, ybot, ytop, txt_scale
61 : logical, intent(in) :: subplot
62 : character (len=*), intent(in) :: title
63 : integer, intent(out) :: ierr
64 : logical, parameter :: &
65 : reverse_xaxis = .false., reverse_yaxis = .false.
66 : ierr = 0
67 : call do_Hist_Track(s, id, device_id, &
68 : xleft, xright, ybot, ytop, subplot, title, txt_scale, &
69 : 'luminosity', 'radius', &
70 : 'L/L\d\(2281)', 'R/R\d\(2281)', &
71 : s% pg% R_L_L_min, s% pg% R_L_L_max, &
72 : s% pg% R_L_L_margin, s% pg% R_L_dL_min, &
73 : s% pg% R_L_R_min, s% pg% R_L_R_max, &
74 : s% pg% R_L_R_margin, s% pg% R_L_dR_min, &
75 : s% pg% R_L_step_min, s% pg% R_L_step_max, &
76 : reverse_xaxis, reverse_yaxis, .false., .false., &
77 : s% pg% show_R_L_target_box, s% pg% R_L_target_n_sigma, &
78 : s% pg% R_L_target_L, s% pg% R_L_target_R, &
79 : s% pg% R_L_target_L_sigma, s% pg% R_L_target_R_sigma, &
80 : s% pg% show_R_L_annotation1, &
81 : s% pg% show_R_L_annotation2, &
82 : s% pg% show_R_L_annotation3, &
83 : s% pg% R_L_fname, &
84 : s% pg% R_L_use_decorator, &
85 : s% pg% R_L_pgstar_decorator, &
86 0 : null_decorate, ierr)
87 0 : end subroutine do_R_L_Plot
88 :
89 : end module pgstar_r_l
|