library(tidyverse)
library(here)
dados_carga <- read_table2(here::here("data/wl_fitdist_best.txt"), col_names = TRUE)
## 
## -- Column specification --------------------------------------------------------
## cols(
##   Param1 = col_double(),
##   Param2 = col_double(),
##   Cluster = col_double(),
##   distribution = col_character(),
##   k = col_double(),
##   Trace = col_character(),
##   stats.attr = col_character(),
##   Size = col_double(),
##   Fraction = col_double()
## )
dados_carga = dados_carga %>% 
    group_by(k, distribution, Trace, stats.attr) %>% 
    summarize(gof = sum(Fraction)) 
## `summarise()` has grouped output by 'k', 'distribution', 'Trace'. You can override using the `.groups` argument.
dados_carga %>%
  ggplot(mapping = aes(y = gof, x = k, color = distribution )) +
  facet_grid(stats.attr ~ Trace) + 
  geom_line()