diff --git a/bg_df.R b/R/bg_df.R similarity index 100% rename from bg_df.R rename to R/bg_df.R diff --git a/codes.R b/R/map_dumbbell.R similarity index 92% rename from codes.R rename to R/map_dumbbell.R index 868c6fa..955c968 100644 --- a/codes.R +++ b/R/map_dumbbell.R @@ -63,15 +63,19 @@ world_visit <- world %>% fill = "burlywood1", color = "navy", size = 0.05) + - geom_jitter(data = full_df_longlat, + geom_point(data = full_df_longlat, aes(x = long, y = lat, color = activity, text = paste0(full_name, "
", city, ", ", country, "
", who)), # alpha = 0.6, - size = 2) + + size = 2, + position = "jitter") + labs(title = "BioGenies in the world") + theme_map() + scale_size_continuous(guide = F) + scale_color_discrete(name = "Type") + - theme(plot.title = element_text(size = 10, hjust = 0.5)) + theme(plot.title = element_text(size = 14, hjust = 0.5), + legend.text = element_text(size=14)) inter_plot <- ggplotly(world_visit, tooltip = "text") +# inter_plot + diff --git a/R/resume_fun.R b/R/resume_fun.R new file mode 100644 index 0000000..9bf7805 --- /dev/null +++ b/R/resume_fun.R @@ -0,0 +1,74 @@ +library(openalexR) +library(tidyverse) + + +research_stay <- function(whois){ + full_df %>% + filter(who == whois & cat == "research stays") %>% + select(group, faculty, name, start_date, end_date, city, country) %>% + arrange(desc(end_date)) %>% + DT::datatable(., options = list(dom = 'tp')) +} + + +work <- function(whois){ + full_df %>% + filter(who == whois & cat == "employment") %>% + select(group, faculty, name, start_date, end_date, position) %>% + arrange(desc(end_date)) %>% + DT::datatable(., options = list(dom = 'tp')) +} + + +education <- function(whois){ + full_df$name <- full_df$name %>% str_remove(., "\n") + + edu_df <- full_df %>% + filter(who == whois & cat == "education") %>% + arrange(desc(end_date)) %>% + mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" + )) +} + + +conf_work <- function(whois){ + full_df %>% + filter(who == whois & cat == "conferences") %>% + select(type, full_name, title, city, country, start_date, end_date) %>% + arrange(desc(end_date)) %>% + mutate(type = case_when( + type == "poster" ~ "πŸ“Š poster", + type == "talk" ~ "πŸ—£οΈ talk", + type == "keynote" ~ "🎀 keynote", + type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" + )) %>% + DT::datatable(., options = list(dom = 'tp')) +} + + +pubs <- function(whois, openalex_id){ + pub <- openalexR::oa_fetch(entity ="works", + author.id = openalex_id) + + pub_mod <- pub$author %>% + lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% + unlist() %>% + tibble(authors = .) %>% + cbind(pub, .) + + pub_mod %>% + filter(type != "dataset") %>% + select(title, authors, doi, publication_date, type, so, host_organization) %>% + drop_na(., doi) %>% + mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), + journal = so %>% as.factor(), + publisher = host_organization %>% as.factor(), + type = type %>% as.factor(), + `publication date` = publication_date %>% as_date() + ) %>% + select(!c(so, host_organization, publication_date)) %>% + arrange(desc(`publication date`)) %>% + DT::datatable(., escape = F, options = list(dom = 'tp')) +} + + diff --git a/_freeze/subsite/team/temp/execute-results/html.json b/_freeze/subsite/team/temp/execute-results/html.json new file mode 100644 index 0000000..0db7735 --- /dev/null +++ b/_freeze/subsite/team/temp/execute-results/html.json @@ -0,0 +1,19 @@ +{ + "hash": "0d28793bf5bd34ce4ad79deb83460128", + "result": { + "engine": "knitr", + "markdown": "---\ntitle: \"\"\nsidebar: false\nformat:\n html:\n grid:\n sidebar-width: 0px\n body-width: 1500px\n margin-width: 300px\n gutter-width: 1.5rem\nknitr:\n opts_chunk:\n out.width: \"95%\"\n---\n\n\n# πŸ“ **Bio**\n\n------------------------------------------------------------------------\n\n\n\n\n# πŸ“± **Contact** {#contact}\n\n------------------------------------------------------------------------\n\n[``{=html}](mailto:)\n[``{=html}](https://github.com/)\n[``{=html}](https://orcid.org/)\n[``{=html}](https://www.facebook.com/)\n[``{=html}](https://www.linkedin.com/in/)\n[``{=html}](https://twitter.com/)\n[``{=html}](https://x.com/)\n[``{=html}]()\n[``{=html}]()\n\n\n\n\n\n\n# πŸš€ **Research stays**\n\n------------------------------------------------------------------------\n\n\n::: {.cell}\n::: {.cell-output-display}\n\n```{=html}\n
\n\n```\n\n:::\n:::\n\n\n\n# πŸ’»πŸ§« **Experience**\n\n------------------------------------------------------------------------\n\n\n::: {.cell}\n::: {.cell-output-display}\n\n```{=html}\n
\n\n```\n\n:::\n:::\n\n\n\n# πŸŽ“ **Education**\n\n------------------------------------------------------------------------\n\n\n::: {.cell}\n\n:::\n\n\n\n\n\n# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 \n\n------------------------------------------------------------------------\n\n\n::: {.cell}\n::: {.cell-output-display}\n\n```{=html}\n
\n\n```\n\n:::\n:::\n\n\n\n# πŸ“– **Publications**\n\n------------------------------------------------------------------------\n\n\n::: {.cell}\n\n:::\n\n\n\n# πŸ§‘πŸ»β€πŸ”¬ **Other activities**\n\n------------------------------------------------------------------------\n\n", + "supporting": [], + "filters": [ + "rmarkdown/pagebreak.lua" + ], + "includes": { + "include-in-header": [ + "\n\n\n\n\n\n\n\n\n\n" + ] + }, + "engineDependencies": {}, + "preserve": {}, + "postProcess": true + } +} \ No newline at end of file diff --git a/subsite/publications.qmd b/subsite/publications.qmd index 7964909..14c9fad 100644 --- a/subsite/publications.qmd +++ b/subsite/publications.qmd @@ -61,6 +61,6 @@ pub_mod %>% - + diff --git a/subsite/team.qmd b/subsite/team.qmd index dd529af..5c68692 100644 --- a/subsite/team.qmd +++ b/subsite/team.qmd @@ -23,11 +23,11 @@ title: "BioGenies team" ::: ```{r, include=FALSE} -source("../bg_df.R") +source("../R/bg_df.R") full_df_mod <- full_df %>% filter(team == "main") -source("../codes.R") +source("../R/map_dumbbell.R") ``` ### πŸš€ Our mobility diff --git a/subsite/team/_temp.qmd b/subsite/team/_temp.qmd new file mode 100644 index 0000000..246dc91 --- /dev/null +++ b/subsite/team/_temp.qmd @@ -0,0 +1,107 @@ +--- +title: "" +sidebar: false +format: + html: + grid: + sidebar-width: 0px + body-width: 1500px + margin-width: 300px + gutter-width: 1.5rem +knitr: + opts_chunk: + out.width: "95%" +--- + +# πŸ“ **Bio** + +------------------------------------------------------------------------ + + + + +# πŸ“± **Contact** {#contact} + +------------------------------------------------------------------------ + +[`r fontawesome::fa("envelope", prefer_type = "regular", fill = "pink", height = "3em")`](mailto:) +[`r fontawesome::fa("github", fill = "#24292e", height = "3em")`](https://github.com/) +[`r fontawesome::fa("orcid", fill = "#A6CE39", height = "3em")`](https://orcid.org/) +[`r fontawesome::fa("facebook", fill = "#304f85", height = "3em")`](https://www.facebook.com/) +[`r fontawesome::fa("linkedin", fill = "#0077b5", height = "3em")`](https://www.linkedin.com/in/) +[`r fontawesome::fa("twitter", fill = "#15a7ff", height = "3em")`](https://twitter.com/) +[`r fontawesome::fa("x-twitter", fill = "#24292e", height = "3em")`](https://x.com/) +[`r fontawesome::fa("steam", fill = "#2f4f4f", height = "3em")`]() +[`r fontawesome::fa("playstation", fill = "#4739aa", height = "3em")`]() + +```{r, echo=FALSE, message=FALSE,include=FALSE} +source("../../R/bg_df.R") + +whois <- "" +openalex_id <- "" + +source("../../R/resume_fun.R") +``` + + +# πŸš€ **Research stays** + +------------------------------------------------------------------------ + +```{r, echo=FALSE, message=FALSE} + +research_stay(whois) + +``` + + +# πŸ’»πŸ§« **Experience** + +------------------------------------------------------------------------ + +```{r, echo=FALSE, message=FALSE} + +work(whois) + +``` + + +# πŸŽ“ **Education** + +------------------------------------------------------------------------ + +```{r, echo=FALSE, message=FALSE} + +edu_df <- education(whois) + +``` + +`r stringr::str_flatten(edu_df$new_col)` + + +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 + +------------------------------------------------------------------------ + +```{r, echo=FALSE, message=FALSE} + +conf_work(whois) + +``` + + +# πŸ“– **Publications** + +------------------------------------------------------------------------ + +```{r, echo=FALSE, message=FALSE} + +# pubs(whois, openalex_id) + +``` + + +# πŸ§‘πŸ»β€πŸ”¬ **Other activities** + +------------------------------------------------------------------------ + diff --git a/subsite/team/jc.qmd b/subsite/team/jc.qmd index d657112..803a964 100644 --- a/subsite/team/jc.qmd +++ b/subsite/team/jc.qmd @@ -35,10 +35,12 @@ something ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "Jarek" openalex_id <- "A5072021711" + +source("../../R/resume_fun.R") ``` @@ -48,11 +50,7 @@ openalex_id <- "A5072021711" ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "research stays") %>% - select(group, faculty, name, start_date, end_date, city, country) %>% - arrange(desc(end_date)) %>% - DT::datatable(., options = list(dom = 'tp')) +research_stay(whois) ``` @@ -63,11 +61,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "employment") %>% - select(group, faculty, name, start_date, end_date, position) %>% - arrange(desc(end_date)) %>% - DT::datatable(., options = list(dom = 'tp')) +work(whois) ``` @@ -78,36 +72,20 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` -# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 ------------------------------------------------------------------------ ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "conferences") %>% - select(type, full_name, title, city, country, start_date, end_date) %>% - arrange(desc(end_date)) %>% - mutate(type = case_when( - type == "poster" ~ "πŸ“Š poster", - type == "talk" ~ "πŸ—£οΈ talk", - type == "keynote" ~ "🎀 keynote", - type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" - )) %>% - DT::datatable(., options = list(dom = 'tp')) +conf_work(whois) ``` @@ -118,31 +96,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ``` diff --git a/subsite/team/jk.qmd b/subsite/team/jk.qmd index 1a8f40b..4486fcb 100644 --- a/subsite/team/jk.qmd +++ b/subsite/team/jk.qmd @@ -10,11 +10,11 @@ format: gutter-width: 1.5rem --- -# πŸ“ **Bio** + ------------------------------------------------------------------------- + -something + # πŸ“± **Contact** {#contact} @@ -32,10 +32,12 @@ something ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "Jakub" openalex_id <- c("A5003763899") + +source("../../R/resume_fun.R") ``` @@ -45,11 +47,7 @@ openalex_id <- c("A5003763899") - - - - - + @@ -60,11 +58,7 @@ openalex_id <- c("A5003763899") - - - - - + @@ -75,36 +69,20 @@ openalex_id <- c("A5003763899") ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` - + - - - - - - - - - - - + @@ -115,31 +93,7 @@ new_df <- full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ``` diff --git a/subsite/team/kg.qmd b/subsite/team/kg.qmd index 93b0469..a4e5c0a 100644 --- a/subsite/team/kg.qmd +++ b/subsite/team/kg.qmd @@ -10,11 +10,11 @@ format: gutter-width: 1.5rem --- -# πŸ“ **Bio** + ------------------------------------------------------------------------- + -something + # πŸ“± **Contact** {#contact} @@ -32,10 +32,12 @@ something ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "Krysia" openalex_id <- "A5064824463" + +source("../../R/resume_fun.R") ``` @@ -45,11 +47,7 @@ openalex_id <- "A5064824463" - - - - - + @@ -60,11 +58,7 @@ openalex_id <- "A5064824463" - - - - - + @@ -75,36 +69,20 @@ openalex_id <- "A5064824463" ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` -# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 ------------------------------------------------------------------------ ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "conferences") %>% - select(type, full_name, title, city, country, start_date, end_date) %>% - arrange(desc(end_date)) %>% - mutate(type = case_when( - type == "poster" ~ "πŸ“Š poster", - type == "talk" ~ "πŸ—£οΈ talk", - type == "keynote" ~ "🎀 keynote", - type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" - )) %>% - DT::datatable(., options = list(dom = 'tp')) +conf_work(whois) ``` @@ -115,31 +93,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ``` diff --git a/subsite/team/mb.qmd b/subsite/team/mb.qmd index a132906..beaee2b 100644 --- a/subsite/team/mb.qmd +++ b/subsite/team/mb.qmd @@ -27,7 +27,7 @@ My current projects: I am also maintaining the list of [machine learning models for prediction of peptide properties](biogenies.info/peptide-prediction-list/) (see also our [article on that](https://doi.org/10.1016/j.csbj.2022.11.043)). -I :heart: [R](https://cran.r-project.org/)! +I ❀️ [R](https://cran.r-project.org/)! # πŸ“± **Contact** {#contact} @@ -45,10 +45,12 @@ I :heart: [R](https://cran.r-project.org/)! ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "MichaΕ‚" openalex_id <- "A5015968787" + +source("../../R/resume_fun.R") ``` @@ -58,11 +60,7 @@ openalex_id <- "A5015968787" - - - - - + @@ -73,11 +71,7 @@ openalex_id <- "A5015968787" ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "employment") %>% - select(group, faculty, name, start_date, end_date, position) %>% - arrange(desc(end_date)) %>% - DT::datatable(., options = list(dom = 'tp')) +work(whois) ``` @@ -88,36 +82,20 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` -# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 ------------------------------------------------------------------------ ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "conferences") %>% - select(type, full_name, title, city, country, start_date, end_date) %>% - arrange(desc(end_date)) %>% - mutate(type = case_when( - type == "poster" ~ "πŸ“Š poster", - type == "talk" ~ "πŸ—£οΈ talk", - type == "keynote" ~ "🎀 keynote", - type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" - )) %>% - DT::datatable(., options = list(dom = 'tp')) +conf_work(whois) ``` @@ -128,31 +106,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ``` diff --git a/subsite/team/vi.qmd b/subsite/team/vi.qmd index b9de342..c5186e5 100644 --- a/subsite/team/vi.qmd +++ b/subsite/team/vi.qmd @@ -10,11 +10,11 @@ format: gutter-width: 1.5rem --- -# πŸ“ **Bio** + ------------------------------------------------------------------------- + -something + # πŸ“± **Contact** {#contact} @@ -32,10 +32,12 @@ something ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "Valen" openalex_id <- "A5002785720" + +source("../../R/resume_fun.R") ``` @@ -45,11 +47,7 @@ openalex_id <- "A5002785720" ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "research stays") %>% - select(group, faculty, name, start_date, end_date, city, country) %>% - arrange(desc(end_date)) %>% - DT::datatable(., options = list(dom = 'tp')) +research_stay(whois) ``` @@ -60,11 +58,7 @@ full_df %>% - - - - - + @@ -75,36 +69,20 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` -# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 ------------------------------------------------------------------------ ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "conferences") %>% - select(type, full_name, title, city, country, start_date, end_date) %>% - arrange(desc(end_date)) %>% - mutate(type = case_when( - type == "poster" ~ "πŸ“Š poster", - type == "talk" ~ "πŸ—£οΈ talk", - type == "keynote" ~ "🎀 keynote", - type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" - )) %>% - DT::datatable(., options = list(dom = 'tp')) +conf_work(whois) ``` @@ -115,31 +93,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ``` diff --git a/subsite/team/wp.qmd b/subsite/team/wp.qmd index 32fc88a..656e3df 100644 --- a/subsite/team/wp.qmd +++ b/subsite/team/wp.qmd @@ -32,10 +32,12 @@ format: ```{r, echo=FALSE, message=FALSE,include=FALSE} -source("../../bg_df.R") +source("../../R/bg_df.R") whois <- "Weronika" openalex_id <- "A5020630771" + +source("../../R/resume_fun.R") ``` @@ -45,11 +47,7 @@ openalex_id <- "A5020630771" - - - - - + @@ -60,11 +58,7 @@ openalex_id <- "A5020630771" - - - - - + @@ -75,36 +69,20 @@ openalex_id <- "A5020630771" ```{r, echo=FALSE, message=FALSE} -full_df$name <- full_df$name %>% str_remove(., "\n") - -new_df <- full_df %>% - filter(who == whois & cat == "education") %>% - arrange(desc(end_date)) %>% - mutate(new_col = paste0("

", "![](../fig/logo/", logo_name, "){width='50'} ", name, "

\n", "

", major, "

[ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "
", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ πŸ“ ", city, ", ", country, " ]{style='float:right;'}" - )) +edu_df <- education(whois) ``` -`r stringr::str_flatten(new_df$new_col)` +`r stringr::str_flatten(edu_df$new_col)` -# πŸ‘πŸ» **Conferences and workshops** 🀝🏻 +# πŸ‘πŸ» **Conferences, workshops** 🀝🏻 ------------------------------------------------------------------------ ```{r, echo=FALSE, message=FALSE} -full_df %>% - filter(who == whois & cat == "conferences") %>% - select(type, full_name, title, city, country, start_date, end_date) %>% - arrange(desc(end_date)) %>% - mutate(type = case_when( - type == "poster" ~ "πŸ“Š poster", - type == "talk" ~ "πŸ—£οΈ talk", - type == "keynote" ~ "🎀 keynote", - type == "workshops" ~ "πŸ§‘πŸ»β€πŸ’» workshops" - )) %>% - DT::datatable(., options = list(dom = 'tp')) +conf_work(whois) ``` @@ -115,31 +93,7 @@ full_df %>% ```{r, echo=FALSE, message=FALSE} -library(openalexR) -library(tidyverse) - -pub <- openalexR::oa_fetch(entity ="works", - author.id = openalex_id) - -pub_mod <- pub$author %>% - lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>% - unlist() %>% - tibble(authors = .) %>% - cbind(pub, .) - -pub_mod %>% - filter(type != "dataset") %>% - select(title, authors, doi, publication_date, type, so, host_organization) %>% - drop_na(., doi) %>% - mutate(doi = paste0('', doi %>% str_remove(., "https://doi.org/"),''), - journal = so %>% as.factor(), - publisher = host_organization %>% as.factor(), - type = type %>% as.factor(), - `publication date` = publication_date %>% as_date() - ) %>% - select(!c(so, host_organization, publication_date)) %>% - arrange(desc(`publication date`)) %>% - DT::datatable(., escape = F, options = list(dom = 'tp')) +pubs(whois, openalex_id) ```