rm(list=ls()) # 必要なライブラリを読み込む library(shiny) # 事前に定義された関数を含むRスクリプトを読み込む source("../script.R") # パネル用関数 orderInputPanel <- function() { conditionalPanel( condition = "output.showOrderInput", numericInput("target_order", "Target Order:", value = 1, min = 1), actionButton("confirm_order", "Confirm Order"), actionButton("cancel_order", "Cancel") ) } textInputPanel <- function() { conditionalPanel( condition = "output.showTextInput", textInput("related_captions_input", "Enter related captions (comma separated):"), actionButton("confirm_text", "Confirm Order"), actionButton("cancel_text", "Cancel") ) } # UIを定義 ui <- fluidPage( # アプリケーションのタイトル titlePanel("SDtagEditoR"), uiOutput("notDRmode"), # CSSを追加 tags$style(type = "text/css", "#image_captions { white-space: pre-wrap; }", ".shiny-action-button { margin-bottom: 50px; }" ), # JavaScript関数を追加 tags$head(tags$script(HTML(" function copyToClipboard(text) { var dummy = document.createElement('textarea'); document.body.appendChild(dummy); dummy.value = text; dummy.select(); document.execCommand('copy'); document.body.removeChild(dummy); } "))), tags$script(HTML(" function handleCaptionClick(caption, source) { var operationModeElement = document.getElementById('notDRmode'); if (operationModeElement && operationModeElement.innerText === 'FALSE') { if (source === 'frequency') { Shiny.setInputValue('clicked_caption_frequency', caption, {priority: 'event'}); } else { Shiny.setInputValue('clicked_caption', caption, {priority: 'event'}); } } else { copyToClipboard(caption); } } ")), # ユーザー入力を受け付ける部分 sidebarLayout( sidebarPanel( # ディレクトリパスを入力するテキストボックス textInput("directory_path", "Enter the directory path:", value = ""), # キャプションデータを読み込むボタン actionButton("load_data", "Load Captions Data"), tags$br(), tags$br(), conditionalPanel( condition = "output.dataLoaded", # 画像の選択 selectInput("selected_image", "Choose an image:", choices = NULL), # 前後の画像に移動するボタン actionButton("prev_image", "Prev"), actionButton("next_image", "Next"), tags$br(), tags$br(), # Direct Removerボタンの追加 actionButton("direct_remover", "Direct Remover"), conditionalPanel( condition = "output.notDRmode === 'FALSE'", # notDRmodeがfalseの場合 actionButton("exit_direct_remover", "Exit Direct Remover") ), tags$br(), tags$br(), conditionalPanel( condition = "output.notDRmode === 'TRUE'", # タブセット actionButton("shuffle_single", "Shuffle Order for Current Image"), actionButton("shuffle_all", "Shuffle Order for All Images"), tags$br(), tags$br(), numericInput("frequency_threshold", "Frequency Threshold:", value = 5, min = 1), actionButton("remove_low_freq", "Remove Low Frequency Captions"), tags$br(), tags$br(), textInput("edit_caption", "Caption to Edit:", ""), actionButton("remove_single", "Remove from Single"), actionButton("remove_from_all", "Remove from All"), # actionButton("edit_interactively", "Edit Interactively"), tags$br(), actionButton("add_single", "Add to Single"), actionButton("add_to_all", "Add to All"), tags$br(), actionButton("move_caption", "Move Caption"), actionButton("move_caption_all", "Move Caption of All"), tags$br(), actionButton("remove_related_single", "Remove Related from Single"), actionButton("remove_related_all", "Remove Related from all"), orderInputPanel(), textInputPanel(), # ここで関数を呼び出しています tags$br(), ), tags$br(), tags$br(), actionButton("output_captions", "Output Edited Captions") ) ), mainPanel( fluidRow( column(6, imageOutput("image_display", width = "100%", height = "50%"), tags$br(), uiOutput("image_captions") ), column(6, verbatimTextOutput("log_output"), # ログの表示領域を追加 fluidRow( # この行を追加 column(6, tableOutput("selected_image_captions")), column(6, tableOutput("caption_frequency_table_with_links")) ) ) ) ) ) ) # サーバーロジックを定義 server <- function(input, output, session) { # リアクティブな変数を定義 directory_path <- reactiveVal() captions_data <- reactiveVal() caption_frequency <- reactiveVal() operation_mode <- reactiveVal("normal") log_text <- reactiveVal("Log:\n") # ログを追加する関数 add_log <- function(message) { current_log <- log_text() new_log <- paste(current_log, message, "\n") log_text(new_log) } # ログを更新する関数 update_log <- function(message) { log_text(message) } # 読み込み確認 output$dataLoaded <- reactive({ !is.null(captions_data()) }) outputOptions(output, "dataLoaded", suspendWhenHidden=FALSE) # パネルの表示/非表示を制御するリアクティブ出力 output$notDRmode <- renderText({ if (operation_mode() != "direct remove") { return("TRUE") } else { return("FALSE") } }) outputOptions(output, "notDRmode", suspendWhenHidden=FALSE) ## Load Data observeEvent(input$load_data, { update_log("Loading captions data...") # ボタンが押されたときに実行されるコード temp_directory_path <- isolate(input$directory_path) temp_captions_data <- read_captions_from_directory(temp_directory_path) temp_caption_frequency <- get_caption_frequency(temp_captions_data) # リアクティブな変数を更新 directory_path(temp_directory_path) captions_data(temp_captions_data) caption_frequency(temp_caption_frequency) # 画像の選択のための選択肢を更新 unique_images <- unique(captions_data()$image_path) updateSelectInput(session, "selected_image", choices = unique_images, selected = unique_images[1]) update_log("Captions data loaded.") }) # 画像の移動 observeEvent(input$prev_image, { current_index <- which(unique(captions_data()$image_path) == input$selected_image) if (current_index > 1) { updateSelectInput(session, "selected_image", selected = unique(captions_data()$image_path)[current_index - 1]) } }) observeEvent(input$next_image, { current_index <- which(unique(captions_data()$image_path) == input$selected_image) if (current_index < length(unique(captions_data()$image_path))) { updateSelectInput(session, "selected_image", selected = unique(captions_data()$image_path)[current_index + 1]) } }) # Direct Removerボタンの動作 observeEvent(input$direct_remover, { operation_mode("direct remove") update_log("DIRECT REMOVER MODE.") }) observeEvent(input$exit_direct_remover, { operation_mode("normal") update_log("Exited Direct Remover mode.") }) # Shuffle Order for Current Image observeEvent(input$shuffle_single, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } current_image <- input$selected_image updated_data <- captions_data() captions_for_current_image <- filter(updated_data, image_path == current_image) # Orderをランダムにする new_order <- sample(1:nrow(captions_for_current_image), nrow(captions_for_current_image)) captions_for_current_image$caption_order <- new_order # データを更新 updated_data[updated_data$image_path == current_image, ] <- captions_for_current_image captions_data(updated_data) update_log("captions of this image was shauffled.") }) # Shuffle Order for All Images observeEvent(input$shuffle_all, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } updated_data <- captions_data() unique_images <- unique(updated_data$image_path) for (image in unique_images) { captions_for_image <- filter(updated_data, image_path == image) new_order <- sample(1:nrow(captions_for_image), nrow(captions_for_image)) captions_for_image$caption_order <- new_order updated_data[updated_data$image_path == image, ] <- captions_for_image } captions_data(updated_data) update_log("captions of all images was shauffled.") }) # remove_low_freqボタンが押されたときの処理 observeEvent(input$remove_low_freq, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } if (!is.null(captions_data())) { threshold <- input$frequency_threshold updated_data <- remove_low_frequency_captions(captions_data(), threshold) captions_data(updated_data) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) } update_log("Low frequency captions removed.") }) # Remove Captions from All Images observeEvent(input$remove_from_all, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } # 指定されたキャプションをすべての画像から削除 target_caption <- input$edit_caption updated_data <- captions_data() unique_images <- unique(updated_data$image_path[updated_data$caption == target_caption]) for (image in unique_images) { updated_data <- remove_caption_and_adjust_order(updated_data, image, target_caption) } captions_data(updated_data) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) update_log("Caption removed from all images.") }) # Remode/Add Single/Add all/move captionの処理 showOrderInput <- reactiveVal(FALSE) showTextInput <- reactiveVal(FALSE) observeEvent(input$remove_single, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } target_caption <- input$edit_caption if (target_caption %in% captions_data()$caption[captions_data()$image_path == input$selected_image]) { updated_data <- remove_caption_and_adjust_order(captions_data(), input$selected_image, target_caption) captions_data(updated_data) update_log("Caption removed from this image.") } else { showNotification("Error: Caption not found in the selected image.", type = "error") } }) observeEvent(input$add_single, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } operation_mode("add_single") showOrderInput(TRUE) update_log("ADD SINGLE MODE.") }) observeEvent(input$add_to_all, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } operation_mode("add_all") showOrderInput(TRUE) update_log("ADD ALL MODE.") }) observeEvent(input$move_caption, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } target_caption <- input$edit_caption if (target_caption %in% captions_data()$caption[captions_data()$image_path == input$selected_image]) { operation_mode("move_caption") showOrderInput(TRUE) update_log("MOVE CAPTION SINGLE MODE.") } else { showNotification("Error: Caption not found in the selected image.", type = "error") } }) observeEvent(input$move_caption_all, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } operation_mode("move_caption_all") showOrderInput(TRUE) update_log("MOVE CAPTION ALL MODE.") }) observeEvent(input$remove_related_single, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } if (!is.null(captions_data())) { selected_image_path <- input$selected_image target_caption <- input$edit_caption # target_captionが選択された画像に紐づいているか確認 if (any(captions_data()$image_path == selected_image_path & captions_data()$caption == target_caption)) { operation_mode("remove_related_single") showTextInput(TRUE) update_log("RELATIVE REMOVE SINGLE MODE.") } else { showNotification("Error: Caption not found in the selected image.", type = "error") } } }) observeEvent(input$remove_related_all, { if (operation_mode() != "normal") { showNotification("Another operation is in progress. Please finish or cancel it first.", type = "error") return() } operation_mode("remove_related_all") showTextInput(TRUE) update_log("RELATIVE REMOVE ALL MODE.") }) observeEvent(input$confirm_order, { switch(operation_mode(), "add_single" = { # Add to Singleの処理 target_caption <- input$edit_caption target_order <- max(1, floor(input$target_order)) updated_data <- add_caption_at_order(captions_data(), input$selected_image, target_caption, target_order) captions_data(updated_data) update_log("Caption added to target order.") }, "add_all" = { target_caption <- input$edit_caption target_order <- target_order <- max(1, floor(input$target_order)) updated_data <- captions_data() unique_images <- unique(updated_data$image_path) for (image in unique_images) { updated_data <- add_caption_at_order(updated_data, image, target_caption, target_order) } captions_data(updated_data) update_log("Caption added to all images.") }, "move_caption" = { # Move Captionの処理 target_caption <- input$edit_caption target_order <- target_order <- max(1, floor(input$target_order)) updated_data <- move_caption_order(captions_data(), input$selected_image, target_caption, target_order) captions_data(updated_data) update_log("Caption moved to target order.") }, "move_caption_all" = { # Move Caption Allの処理 target_caption <- input$edit_caption target_order <- target_order <- max(1, floor(input$target_order)) updated_data <- captions_data() unique_images <- unique(updated_data$image_path[updated_data$caption == target_caption]) for (image in unique_images) { updated_data <- move_caption_order(updated_data, image, target_caption, target_order) } captions_data(updated_data) update_log("Caption moved to target order from all images.") } ) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) operation_mode("normal") showOrderInput(FALSE) }) observeEvent(input$confirm_text, { switch(operation_mode(), "remove_related_single" = { # Remove Related captions of Singleの処理 related_captions <- unlist(strsplit(input$related_captions_input, ",")) related_captions <- trimws(related_captions) # スペースを削除 representative_caption <- input$edit_caption updated_data <- remove_related_captions_except_representative(captions_data(), related_captions, representative_caption, input$selected_image) captions_data(updated_data) update_log("Relative captions were removed from this image.") }, "remove_related_all" = { # Remove Related captions from All Imagesの処理 related_captions <- unlist(strsplit(input$related_captions_input, ",")) related_captions <- trimws(related_captions) # スペースを削除 representative_caption <- input$edit_caption updated_data <- captions_data() # representative_captionを持つすべての画像を検索 images_with_rep_caption <- unique(updated_data$image_path[updated_data$caption == representative_caption]) for (image_path in images_with_rep_caption) { updated_data <- remove_related_captions_except_representative(updated_data, related_captions, representative_caption, image_path) } captions_data(updated_data) update_log("Relative captions were removed from all images.") } ) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) operation_mode("normal") showTextInput(FALSE) }) observeEvent(input$cancel_order, { operation_mode("normal") showOrderInput(FALSE) update_log("Operation was canceled.") }) observeEvent(input$cancel_text, { operation_mode("normal") showTextInput(FALSE) update_log("Operation was canceled.") }) output$showOrderInput <- reactive({ showOrderInput() }) outputOptions(output, "showOrderInput", suspendWhenHidden=FALSE) output$showTextInput <- reactive({ showTextInput() }) outputOptions(output, "showTextInput", suspendWhenHidden=FALSE) # Direct Remove MODE observeEvent(input$clicked_caption, { target_caption <- input$clicked_caption # 単一画像のキャプションを削除 updated_data <- remove_caption_and_adjust_order(captions_data(), input$selected_image, target_caption) captions_data(updated_data) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) update_log("Caption removed from this image.") }) observeEvent(input$clicked_caption_frequency, { target_caption <- input$clicked_caption_frequency # 指定されたキャプションをすべての画像から削除 updated_data <- captions_data() unique_images <- unique(updated_data$image_path[updated_data$caption == target_caption]) for (image in unique_images) { updated_data <- remove_caption_and_adjust_order(updated_data, image, target_caption) } captions_data(updated_data) # キャプションの頻度を更新 updated_caption_frequency <- get_caption_frequency(updated_data) caption_frequency(updated_caption_frequency) update_log("Caption removed from all images.") }) # 書き出し observeEvent(input$output_captions, { # 出力ディレクトリを確認し、存在しない場合は作成 if (!dir.exists("./output")) { dir.create("./output") } # 各画像に対応するキャプションをCSV形式で書き出す unique_images <- unique(captions_data()$image_path) for (image_path in unique_images) { # ファイル名を生成 image_name <- basename(image_path) output_filename <- paste0("./output/", tools::file_path_sans_ext(image_name), ".txt") # キャプションをCSV形式で取得 csv_captions <- capture.output(print_image_captions_as_csv(captions_data(), image_path)) # データをファイルに書き出す writeLines(csv_captions, con = output_filename) } # ログに書き出し完了のメッセージを追加 update_log("Captions data written to ./output/ directory.") }) # レンダリング output$image_display <- renderImage({ list(src = file.path(input$selected_image), alt = "Selected Image", width = "80%") }, deleteFile = FALSE) output$image_captions <- renderUI({ if (!is.null(captions_data())) { selected_image_path <- input$selected_image captions <- filter(captions_data(), image_path == selected_image_path) %>% arrange(caption_order) %>% pull(caption) # キャプションをリンク付きのHTMLに変換 linked_captions <- lapply(captions, function(caption) { sprintf("%s", caption, caption) }) HTML(paste(linked_captions, collapse = ", ")) } }) output$log_output <- renderText({ log_text() }) output$selected_image_captions <- renderTable({ if (!is.null(captions_data())) { selected_image_path <- input$selected_image selected_captions <- filter(captions_data(), image_path == selected_image_path) %>% select(caption, caption_order) %>% arrange(caption_order) # caption列の各エントリにリンクを追加 selected_captions$caption <- sprintf("%s", selected_captions$caption, selected_captions$caption) return(selected_captions) } }, sanitize.text.function = function(x) x) # HTMLをエスケープしないようにする output$caption_frequency_table_with_links <- renderTable({ if (!is.null(caption_frequency())) { freq_data <- caption_frequency() freq_data$caption <- sprintf("%s", freq_data$caption, freq_data$caption) freq_data } }, sanitize.text.function = function(x) x, rownames = TRUE) } # アプリを実行 shinyApp(ui = ui, server = server)