module request_utils implicit none contains pure function success_code(req) use gemini_protocol, only: GEMINI_SUCCESS => STATUS_SUCCESS use http, only: HTTP_SUCCESS => HTTP_CODE_SUCCESS use server_response, only: request implicit none class(request), intent(in)::req integer::success_code if(req%protocol == 'gemini') then success_code = GEMINI_SUCCESS else success_code = HTTP_SUCCESS end if end function success_code pure function notfound_code(req) use gemini_protocol, only: GEMINI_FAIL => STATUS_PERMFAIL use http, only: HTTP_FAIL => HTTP_CODE_NOTFOUND use server_response, only: request implicit none class(request), intent(in)::req integer::notfound_code if(req%protocol == 'gemini') then notfound_code = GEMINI_FAIL else notfound_code = HTTP_FAIL end if end function notfound_code subroutine basic_mimetype(actual_filename, mimetype) use utilities, only: get_one_line_output_shell_command implicit none character(*), intent(in)::actual_filename character(*), intent(out)::mimetype logical::exists ! Check for gemini first since it's fake... if(index(actual_filename, ".gmi") /= 0) then mimetype = "text/gemini" else inquire(file=actual_filename, exist=exists) if(exists) then call get_one_line_output_shell_command("mimetype -b "//trim(actual_filename), mimetype) else ! If it doesn't exist, use the extension dumbly if(index(actual_filename, ".txt") /= 0) then mimetype = "text/plain" else if(index(actual_filename, ".json") /= 0) then mimetype = "text/plain" else if(index(actual_filename, ".html") /= 0) then mimetype = "text/html" else if(index(actual_filename, ".css") /= 0) then mimetype = "text/css" ! Just a catch-all, whatever... else mimetype = "application/octet-stream" end if end if end if end subroutine basic_mimetype pure function get_status_utf8(status) result(res) use captain_db implicit none integer, intent(in)::status character(4)::res select case(status) case(JOB_STATUS_SUCCESS) ! Check mark 0x2714 res = char(226)//char(156)//char(148)//" " case(JOB_STATUS_FAILURE) ! Ballot x 0x2717 res = char(226)//char(156)//char(151)//" " case(JOB_STATUS_WORKING) ! Runner 0x1f3c3 res = char(240)//char(159)//char(143)//char(131) case(PLAYER_STATUS_IDLE) ! Sleeping 0x1f4a4 res = char(240)//char(159)//char(146)//char(164) case(JOB_STATUS_PENDING) ! Envelope 0x2709 res = char(226)//char(156)//char(137)//" " end select end function get_status_utf8 function is_request_static(req) use server_response use logging implicit none class(request), intent(in)::req logical::is_request_static character(64)::first, last character(4)::ext integer::j call req%path_component(1, first) call req%last_component(last) j = index(last, ".", back=.true.) if(j > 0) then ext = last(j+1:len_trim(last)) else ext = " " end if call write_log("Static check: "//trim(first), LOG_DEBUG) is_request_static = ((trim(first) == "releases") .or. & (trim(first) == "uploads") .or. & (trim(first) == "results") .or. & (trim(first) == "static") .or. & (trim(first) == "favicon.txt") .or. & (trim(first) == "instructions" .and. trim(ext) == "json")) end function is_request_static function request_static(req) result(resp) use logging use config use utilities use server_response use special_filenames implicit none class(request), intent(in)::req type(response)::resp character(64)::category character(256)::filename logical::exists resp%temporary_file = .false. call req%path_component(1, category) call req%path_starting_with_component(2, filename) resp%body_filename => get_special_full_filename(trim(category), trim(filename)) inquire(file=resp%body_filename, exist=exists) if(.not. exists) then resp%code = notfound_code(req) call write_log("File did not exist: "//resp%body_filename, LOG_NORMAL) else resp%code = success_code(req) call basic_mimetype(resp%body_filename, resp%body_mimetype) end if end function request_static function render_jobs_links(jobs, startindex, stopindex, gemini_mode) result(res) use captain_db implicit none type(job), dimension(:), pointer, intent(in)::jobs integer, intent(in), optional::startindex, stopindex logical, intent(in)::gemini_mode character(len=:), pointer::res integer::nsize, i, first, last character(len=16)::int_text character(len=(2*PLAYER_NAME_LENGTH + 64))::link character(PLAYER_NAME_LENGTH)::player, instruction character(1)::nl = new_line(' ') if(.not. associated(jobs)) then allocate(character(len=32)::res) res = "None Yet" else first = 1 if(present(startindex)) then first = startindex end if last = size(jobs) if(present(stopindex)) then last = min(size(jobs), stopindex) end if if(first <= last .and. first <= size(jobs)) then nsize = (last-first+1)*(2*PLAYER_NAME_LENGTH + 64) + 32 allocate(character(len=nsize) :: res) if(gemini_mode) then res = " " else res ="" end if else ! Indices exceed array allocate(character(len=64)::res) write(int_text, '(I8)') first res = "None at index "//trim(adjustl(int_text))//" or beyond" end if end if end function render_jobs_links subroutine get_job_page_title(req, title) use captain_db use server_response implicit none type(request), intent(in)::req character(*), intent(out)::title integer::job_id, i character(32)::job_text character(PLAYER_NAME_LENGTH)::instruction_name ! All this to get the job id call req%last_component(job_text) i = index(job_text, ".") job_text(i:len(job_text)) = " " read(job_text, '(I8)') job_id ! Request instruction name i = get_job_instruction(job_id) call get_instruction_name(i, instruction_name) title = "Job "//trim(job_text)//" - "//trim(instruction_name) end subroutine get_job_page_title end module request_utils