Line data Source code
1 : ! ***********************************************************************
2 : !
3 : ! Copyright (C) 2012 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_logg_logT
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 logg_logT_Plot(id, device_id, ierr)
32 : integer, intent(in) :: id, device_id
33 : integer, intent(out) :: ierr
34 :
35 : type (star_info), pointer :: s
36 : ierr = 0
37 0 : call get_star_ptr(id, s, ierr)
38 0 : if (ierr /= 0) return
39 :
40 0 : call pgslct(device_id)
41 0 : call pgbbuf()
42 0 : call pgeras()
43 :
44 : call do_logg_logT_Plot(s, id, device_id, &
45 : s% pg% logg_logT_xleft, s% pg% logg_logT_xright, &
46 : s% pg% logg_logT_ybot, s% pg% logg_logT_ytop, .false., &
47 0 : s% pg% logg_logT_title, s% pg% logg_logT_txt_scale, ierr)
48 0 : if (ierr /= 0) return
49 :
50 0 : call pgebuf()
51 :
52 : end subroutine logg_logT_Plot
53 :
54 :
55 0 : subroutine do_logg_logT_Plot(s, id, device_id, &
56 : xleft, xright, ybot, ytop, subplot, &
57 : title, txt_scale, ierr)
58 : use pgstar_hist_track, only: null_decorate, do_Hist_Track
59 : type (star_info), pointer :: s
60 : integer, intent(in) :: id, device_id
61 : real, intent(in) :: xleft, xright, ybot, ytop, txt_scale
62 : logical, intent(in) :: subplot
63 : character (len=*), intent(in) :: title
64 : integer, intent(out) :: ierr
65 : logical, parameter :: &
66 : reverse_xaxis = .true., reverse_yaxis = .true.
67 : ierr = 0
68 : call do_Hist_Track(s, id, device_id, &
69 : xleft, xright, ybot, ytop, subplot, title, txt_scale, &
70 : 'log_Teff', 'log_g', &
71 : 'logT', 'log g', &
72 : s% pg% logg_logT_logT_min, s% pg% logg_logT_logT_max, &
73 : s% pg% logg_logT_logT_margin, s% pg% logg_logT_dlogT_min, &
74 : s% pg% logg_logT_logg_min, s% pg% logg_logT_logg_max, &
75 : s% pg% logg_logT_logg_margin, s% pg% logg_logT_dlogg_min, &
76 : s% pg% logg_logT_step_min, s% pg% logg_logT_step_max, &
77 : reverse_xaxis, reverse_yaxis, .false., .false., &
78 : s% pg% show_logg_logT_target_box, s% pg% logg_logT_target_n_sigma, &
79 : s% pg% logg_logT_target_logT, s% pg% logg_logT_target_logg, &
80 : s% pg% logg_logT_target_logT_sigma, s% pg% logg_logT_target_logg_sigma, &
81 : s% pg% show_logg_logT_annotation1, &
82 : s% pg% show_logg_logT_annotation2, &
83 : s% pg% show_logg_logT_annotation3, &
84 : s% pg% logg_logT_fname, &
85 : s% pg% logg_logT_use_decorator, &
86 : s% pg% logg_logT_pgstar_decorator, &
87 0 : null_decorate, ierr)
88 0 : end subroutine do_logg_logT_Plot
89 :
90 : end module pgstar_logg_logT
|