@@ -13,114 +13,14 @@ knitr:
1313 out.width : " 95%"
1414---
1515
16- ``` {r, echo=FALSE, message=FALSE}
17- library(fontawesome)
18- library(tidyverse)
19- library(googlesheets4)
20- library(ggalt)
21- library(patchwork)
22- library(RColorBrewer)
23-
24- con <- googlesheets4::read_sheet("https://docs.google.com/spreadsheets/d/1UXBQs_tu0cRYN3XDEPsq3MxlUNvryPEnR-ClSp2uipo/edit?gid=0#gid=0",
25- sheet = "conferences") %>% mutate(activity = "conferences")
26- edu <- googlesheets4::read_sheet("https://docs.google.com/spreadsheets/d/1UXBQs_tu0cRYN3XDEPsq3MxlUNvryPEnR-ClSp2uipo/edit?gid=0#gid=0",
27- sheet = "edu") %>% mutate(activity = "education")
28- int <- googlesheets4::read_sheet("https://docs.google.com/spreadsheets/d/1UXBQs_tu0cRYN3XDEPsq3MxlUNvryPEnR-ClSp2uipo/edit?gid=0#gid=0",
29- sheet = "internships") %>% mutate(activity = "research stays")
30- emp <- googlesheets4::read_sheet("https://docs.google.com/spreadsheets/d/1UXBQs_tu0cRYN3XDEPsq3MxlUNvryPEnR-ClSp2uipo/edit?gid=0#gid=0",
31- sheet = "work") %>% mutate(activity = "employment")
32- team <- googlesheets4::read_sheet("https://docs.google.com/spreadsheets/d/1UXBQs_tu0cRYN3XDEPsq3MxlUNvryPEnR-ClSp2uipo/edit?gid=0#gid=0",
33- sheet = "team")
34-
35- full_df <- full_join(con, edu, by = c("start_date", "end_date", "city", "country", "name", "who", "activity")) %>%
36- full_join(., int, by = c("start_date", "end_date", "city", "country", "name", "who", "activity")) %>%
37- full_join(., emp, by = c("start_date", "end_date", "city", "country", "name", "who", "group", "faculty", "activity")) %>%
38- full_join(., team, by = c("who")) %>%
39- mutate(start_date = as.Date(start_date, "%d.%m.%Y"),
40- start_date = if_else(is.na(start_date), today(), start_date),
41- end_date = as.Date(end_date, "%d.%m.%Y"),
42- end_date = if_else(is.na(end_date), today(), end_date),
43- cat = as.factor(activity),
44- type = as.factor(type),
45- who = as.factor(who),
46- full_name = if_else(full_name %>% is.na(), name, full_name)) %>%
47- filter(team == "main")
48-
49-
50- # plots
51-
52- my_colors <- scale_fill_hue()$palette(full_df$who %>% levels() %>% length())
53- names(my_colors) <- full_df$who %>% levels()
54-
55- p <- lapply(full_df$cat %>% levels(), function(i){
56- full_df %>%
57- filter(activity == i) %>%
58- ggplot(., aes(y = name, color = who)) +
59- geom_segment(aes(x = start_date, xend = end_date), linewidth = 2, position = position_dodgev(height = 0.9)) +
60- geom_point(aes(x = start_date, y = name), size = 3, position = position_dodgev(height = 0.9)) +
61- geom_point(aes(x = end_date, y = name), size = 3, position = position_dodgev(height = 0.9)) +
62- scale_fill_manual(values = my_colors, aesthetics = "color") +
63- labs(title = paste0("BioGenies ", i), x = "Year", y = "Destination") +
64- theme_minimal() +
65- xlab("Dates")
66- })
67-
68-
69- # pw_plot <- (p[[1]] & theme(legend.position = "bottom")) + ((p[[2]] / p[[3]] / p[[4]]) & theme(legend.position = "none")) + plot_layout(guides = "auto")
70-
71- pw_plot <- (p[[1]] | (p[[2]] / p[[3]] / p[[4]] & theme(legend.position = "none")) + plot_layout(axes = "collect", axis_titles = "collect"))
72-
73- pw_plot
74-
75-
76- # map
77-
78- library(gapminder)
79- library(tidygeocoder)
80- library(plotly)
81- library(ggthemes)
82-
83- world <- map_data("world") %>%
84- filter(region != "Antarctica")
85-
86- gapminder_codes <- gapminder::country_codes
87- gapminder <- gapminder::gapminder_unfiltered
88-
89- gapminder <- gapminder %>%
90- inner_join(gapminder_codes, by= "country") %>%
91- mutate(code = iso_alpha)
92-
93- gapminder_data <- gapminder %>%
94- inner_join(maps::iso3166 %>%
95- select(a3, mapname), by= c(code = "a3")) %>%
96- mutate(mapname = str_remove(mapname, "\\(.*"))
97-
98- ## cities <- lon & lat
99-
100- full_df_longlat <- full_df %>% geocode(city = city, country = country)
101-
102- world_visit <- world %>%
103- ggplot() +
104- geom_polygon(aes(x = long, y = lat, group = group),
105- fill = "springgreen2",
106- color = "deepskyblue1",
107- size = 0.01) +
108- geom_point(data = full_df_longlat, aes(x = long, y = lat, color = activity, text = paste0(activity, "<br>", city, " ", country, "<br>", who)), alpha = 0.6) +
109- labs(title = "BioGenies in the world") +
110- theme_map() +
111- scale_size_continuous(guide = F) +
112- scale_color_discrete(name = "Type") +
113- theme(plot.title = element_text(size = 10, hjust = 0.5))
114-
115-
116- inter_plot <- ggplotly(world_visit, tooltip = "text")
117-
118- inter_plot
119- ```
16+ # 📝 ** Bio**
17+
18+ ------------------------------------------------------------------------
19+
20+ something
12021
121- ### Bio
12222
123- ### Contact info {#contact}
23+ # 📱 ** Contact ** {#contact}
12424
12525------------------------------------------------------------------------
12626
@@ -134,22 +34,129 @@ inter_plot
13434<!-- [`r fontawesome::fa("steam", fill = "#2f4f4f", height = "3em")`]() -->
13535<!-- [`r fontawesome::fa("playstation", fill = "#4739aa", height = "3em")`]() -->
13636
137- ### Conferences and workshops
37+ ``` {r, echo=FALSE, message=FALSE,include=FALSE}
38+ source("../../bg_df.R")
39+
40+ whois <- "Jarek"
41+ openalex_id <- "A5072021711"
42+ ```
43+
44+
45+ # 🚀 ** Research stays**
46+
47+ ------------------------------------------------------------------------
48+
49+ ``` {r, echo=FALSE, message=FALSE}
50+
51+ full_df %>%
52+ filter(who == whois & cat == "research stays") %>%
53+ select(group, faculty, name, start_date, end_date, city, country) %>%
54+ arrange(desc(end_date)) %>%
55+ DT::datatable(., options = list(dom = 'tp'))
56+
57+ ```
58+
59+
60+ # 💻🧫 ** Experience**
61+
62+ ------------------------------------------------------------------------
63+
64+ ``` {r, echo=FALSE, message=FALSE}
65+
66+ full_df %>%
67+ filter(who == whois & cat == "employment") %>%
68+ select(group, faculty, name, start_date, end_date, position) %>%
69+ arrange(desc(end_date)) %>%
70+ DT::datatable(., options = list(dom = 'tp'))
71+
72+ ```
73+
74+
75+ # 🎓 ** Education**
76+
77+ ------------------------------------------------------------------------
78+
79+ ``` {r, echo=FALSE, message=FALSE}
80+
81+ full_df$name <- full_df$name %>% str_remove(., "\n")
82+
83+ new_df <- full_df %>%
84+ filter(who == whois & cat == "education") %>%
85+ arrange(desc(end_date)) %>%
86+ mutate(new_col = paste0("<h3>", "{width='50'} ", name, "</h3>\n", "<h4> ", major, "</h4> [ ", start_date, " - ", end_date, " ]", "{style='float:right;'}", "<br> ", if_else(thesis_title %>% is.na, " ", paste0("Thesis: **", thesis_title, "** ")), "[ 📍 ", city, ", ", country, " ]{style='float:right;'}"
87+ ))
88+
89+ ```
90+
91+ ` r stringr::str_flatten(new_df$new_col) `
92+
93+
94+ # 👏🏻 ** Conferences and workshops** 🤝🏻
95+
96+ ------------------------------------------------------------------------
97+
98+ ``` {r, echo=FALSE, message=FALSE}
99+
100+ full_df %>%
101+ filter(who == whois & cat == "conferences") %>%
102+ select(type, full_name, title, city, country, start_date, end_date) %>%
103+ arrange(desc(end_date)) %>%
104+ mutate(type = case_when(
105+ type == "poster" ~ "📊 poster",
106+ type == "talk" ~ "🗣️ talk",
107+ type == "keynote" ~ "🎤 keynote",
108+ type == "workshops" ~ "🧑🏻💻 workshops"
109+ )) %>%
110+ DT::datatable(., options = list(dom = 'tp'))
111+
112+ ```
113+
114+
115+ # 📖 ** Publications**
116+
117+ ------------------------------------------------------------------------
118+
119+ ``` {r, echo=FALSE, message=FALSE}
138120
139- # ```{r, echo=FALSE, message=FALSE}
140- # int_mod %>%
141- # ggplot(., aes(x = start_date, xend = end_date, y = place, color = country, linewidth = 3), height = 2, width = 8) +
142- # # scale_x_date(date_breaks = "6 month", date_labels = "%M") +
143- # geom_dumbbell(colour_x = "#a3c4dc", colour_xend = "#0e668b", size = 2) +
144- # theme_minimal()
145- # ```
146- #
147- # ```{r, echo=FALSE, message=FALSE}
148- # DT::datatable(int_mod)
149- # ```
121+ library(openalexR)
122+ library(tidyverse)
123+
124+ pub <- openalexR::oa_fetch(entity ="works",
125+ author.id = openalex_id)
126+
127+ pub_mod <- pub$author %>%
128+ lapply(., function(x) {x$au_display_name %>% str_flatten(., collapse = ", ")}) %>%
129+ unlist() %>%
130+ tibble(authors = .) %>%
131+ cbind(pub, .)
132+
133+ pub_mod %>%
134+ filter(type != "dataset") %>%
135+ select(title, authors, doi, publication_date, type, so, host_organization) %>%
136+ drop_na(., doi) %>%
137+ mutate(doi = paste0('<a target=_blank href=', doi, '>', doi %>% str_remove(., "https://doi.org/"),'</a>'),
138+ journal = so %>% as.factor(),
139+ publisher = host_organization %>% as.factor(),
140+ type = type %>% as.factor(),
141+ `publication date` = publication_date %>% as_date()
142+ ) %>%
143+ select(!c(so, host_organization, publication_date)) %>%
144+ arrange(desc(`publication date`)) %>%
145+ DT::datatable(., escape = F, options = list(dom = 'tp'))
146+
147+ ```
148+
149+
150+ # 🧑🏻🔬 ** Other activities**
151+
152+ ------------------------------------------------------------------------
150153
154+ #### Association of Wrocław R Users (STWUR) meetings co-organizer - R language workshops.
151155
156+ #### Co-organizer of WhyR? 2019 Conference in Warsaw.
152157
158+ #### Co-organizer of WhyR? 2018 Conference in Wrocław.
153159
160+ #### CEO of PhD Bioinformatics Club at University of Wrocław, 2017-2023
154161
155162
0 commit comments