# Set random seed for reproducibility
set.seed(123)
library(tidyverse)
## Warning: 程辑包'tidyverse'是用R版本4.2.3 来建造的
## Warning: 程辑包'ggplot2'是用R版本4.2.3 来建造的
## Warning: 程辑包'tibble'是用R版本4.2.3 来建造的
## Warning: 程辑包'tidyr'是用R版本4.2.3 来建造的
## Warning: 程辑包'readr'是用R版本4.2.3 来建造的
## Warning: 程辑包'purrr'是用R版本4.2.3 来建造的
## Warning: 程辑包'dplyr'是用R版本4.2.3 来建造的
## Warning: 程辑包'stringr'是用R版本4.2.3 来建造的
## Warning: 程辑包'forcats'是用R版本4.2.3 来建造的
## Warning: 程辑包'lubridate'是用R版本4.2.3 来建造的
## -- Attaching core tidyverse packages ------------------------ tidyverse 2.0.0 --
## v dplyr     1.1.4     v readr     2.1.5
## v forcats   1.0.0     v stringr   1.5.1
## v ggplot2   3.4.2     v tibble    3.2.1
## v lubridate 1.9.3     v tidyr     1.3.1
## v purrr     1.0.2     
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
## i Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
# Create dataframe with random AUC values between 0.65-0.75, maintaining decreasing trend
data <- data.frame(
  cutoff_ratio_ac50 = c(0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9),
  AUC = sort(runif(9, 0.65, 0.75), decreasing = TRUE)
)

# Calculate step size for x-axis
step_size <- diff(data$cutoff_ratio_ac50)[1]

# Generate data for step plot horizontal lines
segments_data <- data.frame(
  x = data$cutoff_ratio_ac50,
  xend = c(data$cutoff_ratio_ac50[-1], data$cutoff_ratio_ac50[9] + step_size),
  y = data$AUC,
  yend = data$AUC
)

# Generate data for step plot vertical lines
vertical_segments <- data.frame(
  x = data$cutoff_ratio_ac50[-1],
  xend = data$cutoff_ratio_ac50[-1],
  y = data$AUC[-length(data$AUC)],
  yend = data$AUC[-1]
)

# Calculate x-axis break positions
breaks <- segments_data$x + diff(c(segments_data$x, segments_data$xend[nrow(segments_data)]))/2

# Generate random counts for bar plot while maintaining proportion relationships
active_counts <- round(runif(10, 200, 400))
inactive_counts <- round(runif(10, 800, 1100))

# Create bar plot data frame
data_bars <- data.frame(
  cutoff_ratio_ac50 = c(0.1,0.1,0.2,0.2,0.3,0.3,0.4,0.4,0.5,0.5,0.6,0.6,0.7,0.7,0.8,0.8,0.9,0.9,1.0,1.0),
  key = factor(rep(c("Active", "Inactive"), 10), levels=c("Active", "Inactive")),
  value = c(rbind(active_counts, inactive_counts))
)

library(patchwork)
## Warning: 程辑包'patchwork'是用R版本4.2.2 来建造的
# Step plot (upper panel)
p1 <- ggplot() +
  geom_segment(data=segments_data, 
               aes(x=x, xend=xend, y=y, yend=yend),
               color="#b5d6e8", size=1) +
  geom_segment(data=vertical_segments,
               aes(x=x, xend=xend, y=y, yend=yend),
               color="#b5d6e8", size=1) +
  geom_text(data=data.frame(
    x = segments_data$x + (segments_data$xend - segments_data$x)/2,
    y = segments_data$y,
    label = sprintf("%.2f", segments_data$y)),
    aes(x=x, y=y, label=label),
    vjust=-0.5, size=3.5) +
  scale_x_reverse(
    breaks = breaks,
    labels = data$cutoff_ratio_ac50,
    limits = c(1.0, 0.1)
  ) +
  labs(
    title = "",
    y = "value"
  ) +
  theme_minimal() +
  theme(
    panel.grid = element_blank(),
    axis.ticks.y = element_line(color = "black"),
    axis.ticks.x = element_blank(),
    axis.ticks.length = unit(1.2, "mm"),
    axis.line.y = element_line(color = "black"),
    axis.line.x =  element_blank(),
    plot.title = element_text(hjust = 0.5, size = 12),
    axis.text = element_text(size = 11, color = "black"),
    axis.title = element_text(size = 11, color = "black"),
    axis.title.x = element_blank(),
    axis.text.x = element_blank(),
    plot.margin = margin(t = 5, r = 5, b = 0, l = 5, unit = "pt")
  ) 
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## i Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
# Set y-axis limits and breaks for step plot
p1 <- p1 + scale_y_continuous(expand = c(0, 0), limits = c(0.649, 0.74), breaks = seq(0.65, 0.74, 0.02))
p1
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).

# Bar plot (lower panel)
p2 <- ggplot() +
  geom_bar(data = data_bars,
           aes(x=as.numeric(as.character(cutoff_ratio_ac50)) - step_size/2, 
               y=value, fill=key),
           stat="identity", position="stack", width=step_size,
           color="gray70", linewidth=0.2) +
  # Add dashed dividing line
  geom_segment(data = subset(data_bars, key=="Inactive"),
               aes(x = as.numeric(as.character(cutoff_ratio_ac50)) - step_size,
                   xend = as.numeric(as.character(cutoff_ratio_ac50)),
                   y = value, yend = value),
               color = "gray70", size = 0.5, linetype = "dashed") +
  # Add value labels for Active category
  geom_text(data = subset(data_bars, key=="Active"),
            aes(x=as.numeric(as.character(cutoff_ratio_ac50)) - step_size/2, 
                y = value/2, label = value), size = 3, color = "#CCEBC5") +
  # Add value labels for Inactive category (transparent)
  geom_text(data = subset(data_bars, key=="Inactive"),
            aes(x=as.numeric(as.character(cutoff_ratio_ac50)) - step_size/2, 
                y = value + lag(value)/2), 
            label = subset(data_bars, key=="Inactive")$value, size = 3, color = "red", alpha = 0) +
  scale_fill_manual(values=c("Active" = "#DECBE4", "Inactive" = "#CCEBC5")) +
  scale_x_reverse(
    breaks = breaks,
    labels = data$cutoff_ratio_ac50,
    limits = c(1.0, 0.1)
  ) +
  labs(
    x = expression(IC[50]*","*"comb"~"/"~IC[50]*","*"single threshold"),
    y = "Count",
    fill = "Category"
  ) +
  theme_minimal() +
  theme(
    panel.grid = element_blank(),
    axis.ticks = element_line(color = "black"),
    axis.ticks.length = unit(1.2, "mm"),
    axis.line = element_line(color = "black"),
    axis.text = element_text(size = 11, color = "black"),
    axis.title = element_text(size = 11, color = "black"),
    legend.key.size = unit(0.3, "cm"),
    plot.margin = margin(t = 0, r = 5, b = 5, l = 5, unit = "pt"),
    legend.text = element_text(size = 10),
    legend.title = element_text(size = 10),
    legend.margin = margin(0, 0, 0, 0),
    legend.box.margin = margin(0.1, 0.1, 0.1, 0.1)
  )

# Set y-axis limits and breaks for bar plot
p2 <- p2 + scale_y_continuous(limits = c(0, 1240), expand = c(0, 0), breaks = seq(0, 1240, 500))
p2
## Warning: Removed 2 rows containing missing values (`position_stack()`).
## Warning: Removed 5 rows containing missing values (`geom_bar()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
## Warning: Removed 10 rows containing missing values (`geom_text()`).

# Combine plots and adjust legend position
combined_plot <- p1 + p2 + plot_layout(ncol = 1, heights = c(1, 0.2)) + 
  theme(legend.position=c(0.8,1.6))
combined_plot
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
## Warning: Removed 2 rows containing missing values (`position_stack()`).
## Warning: Removed 5 rows containing missing values (`geom_bar()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
## Warning: Removed 10 rows containing missing values (`geom_text()`).

# Save plot
ggsave(filename = paste0(Sys.Date(), "_", "plot_test.tif"), 
       plot = last_plot(), 
       device = "tiff",
       scale = 1, 
       width = 9, 
       height = 9, 
       units = "cm",
       dpi = 300, 
       limitsize = TRUE, 
       compression = "lzw")
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
## Warning: Removed 2 rows containing missing values (`position_stack()`).
## Warning: Removed 5 rows containing missing values (`geom_bar()`).
## Warning: Removed 1 rows containing missing values (`geom_segment()`).
## Warning: Removed 1 rows containing missing values (`geom_text()`).
## Warning: Removed 10 rows containing missing values (`geom_text()`).