Skip to content

Commit

Permalink
cleaning away unused comment and empty lines
Browse files Browse the repository at this point in the history
  • Loading branch information
federicomarini committed Mar 15, 2024
1 parent 0920f75 commit 913b302
Show file tree
Hide file tree
Showing 2 changed files with 0 additions and 22 deletions.
21 changes: 0 additions & 21 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -58,7 +58,6 @@ view_initial_tiles <- function(initial) {
FUN.VALUE = numeric(1))

# check: max value should be 12 (but it is a given through iSEE)

panel_types <- vapply(initial, class, character(1))

total_tiles <- sum(panel_widths)
Expand Down Expand Up @@ -117,32 +116,13 @@ view_initial_tiles <- function(initial) {
panel_vector[(abs_pos + 1):(cur_row * 12)] <- NA
}

# waffled_matrix <- matrix(data = tiles_vector,
# nrow = nr_rows, byrow = TRUE)

waffled_matrix_long <- expand.grid(seq_len(12), seq_len(cur_row))
# waffled_matrix_long <- expand.grid(seq_len(12), seq_len(nr_rows))
waffled_matrix_long$Var1 <- as.factor(waffled_matrix_long$Var1)
waffled_matrix_long$Var2 <- as.factor(waffled_matrix_long$Var2)
waffled_matrix_long$panel_color <- tiles_vector
waffled_matrix_long$panel_type <- panel_vector

# waffled_matrix_long$panel_name <- panel_types


# p <- ggplot(waffled_matrix_long,
# aes(x=.data$Var1,
# y=.data$Var2)) +
# geom_tile(aes(fill = I(panel_color)), col = "white") +
# scale_y_discrete(limits = rev(levels(waffled_matrix_long$Var2))) +
# theme_void() +
# scale_fill_manual(
# values = c("ReducedDimensionPlot" = "#3565AA")
# # values = iSEE_panel_colors
# # labels = names(iSEE_panel_colors)
# )


p <- ggplot(na.omit(waffled_matrix_long),
aes(x = .data$Var1,
y = .data$Var2)) +
Expand Down Expand Up @@ -227,7 +207,6 @@ view_initial_network <- function(initial,
FUN.VALUE = numeric(1))

# check: max value should be 12 (but it is a given through iSEE)

panel_types <- vapply(initial, class, character(1))

# need to have SIMPLIFIED configs
Expand Down
1 change: 0 additions & 1 deletion vignettes/iSEEfier_userguide.Rmd
Original file line number Diff line number Diff line change
Expand Up @@ -222,7 +222,6 @@ g1
initial2 <- results$initial
g2 <- view_initial_network(initial2, plot_format = "visNetwork")
```

# Merge different initial configurations with `glue_initials()`
Expand Down

0 comments on commit 913b302

Please sign in to comment.