Skip to content

Commit

Permalink
Update site
Browse files Browse the repository at this point in the history
Signed-off-by: Liang Zhang <[email protected]>
  • Loading branch information
psychelzh committed Dec 13, 2023
1 parent 9e2eace commit 4d494a0
Show file tree
Hide file tree
Showing 6 changed files with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions _freeze/index/execute-results/html.json
Original file line number Diff line number Diff line change
@@ -1,7 +1,7 @@
{
"hash": "6bec3289bbc982bc9a3572eeca95961e",
"hash": "a0a341622a5e552faf3b3e63216cb6c5",
"result": {
"markdown": "---\ntitle: Representation Analysis\nauthor:\n - name: Liang Zhang\n - name: Jintao Sheng\nformat:\n html:\n code-fold: true\n toc: true\nexecute:\n warning: false\nbibliography: references.bib\n---\n\n::: {.cell}\n\n```{.r .cell-code}\nlibrary(tidyverse)\n```\n:::\n\n\n# Inter-subject representation similarity\n\n## Abstract vs Concrete\n\n\n::: {#fig-inter-abs-con .cell}\n\n```{.r .cell-code}\ntargets::tar_read(rsa_inter_common_trials) |>\n summarise(\n mean_se(fisher_z),\n .by = c(region_id, word_category)\n ) |>\n ggplot(aes(region_id, y, ymax = ymax, ymin = ymin)) +\n geom_col(aes(fill = word_category), position = position_dodge(width = 0.4), width = 0.4) +\n geom_errorbar(aes(group = word_category), position = position_dodge(width = 0.4), width = 0) +\n scale_x_continuous(name = \"Region\", breaks = scales::breaks_width(1)) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n ggsci::scale_fill_d3(name = \"Word Type\") +\n ggpubr::theme_pubclean()\n\ntargets::tar_read(summary_word_cat_rsa_inter_common_trials_window) |>\n ggplot(aes(window_id, y, ymax = ymax, ymin = ymin)) +\n geom_line(aes(color = word_category, group = word_category)) +\n geom_ribbon(aes(fill = word_category), alpha = 0.5) +\n scale_x_continuous(name = \"Time (ms)\", labels = \\(x) x * 20) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n ggsci::scale_fill_d3(name = \"Word Type\") +\n ggsci::scale_color_d3(name = \"Word Type\") +\n facet_wrap(vars(region_id)) +\n ggpubr::theme_pubclean()\n```\n\n::: {.cell-output-display}\n![Without window](index_files/figure-html/fig-inter-abs-con-1.png){#fig-inter-abs-con-1 width=672}\n:::\n\n::: {.cell-output-display}\n![Dynamic of a trial](index_files/figure-html/fig-inter-abs-con-2.png){#fig-inter-abs-con-2 width=672}\n:::\n\nVerify if intersubject similarity of concrete is larger than that of abstract.\n:::\n\n\n## Subsequent memory effect\n\n\n::: {.cell}\n\n```{.r .cell-code}\ntargets::tar_read(rsa_inter_common_trials) |>\n summarise(\n mean_se(fisher_z),\n .by = c(region_id, response_type_shared)\n ) |>\n ggplot(aes(region_id, y, ymax = ymax, ymin = ymin)) +\n geom_col(aes(fill = response_type_shared), position = position_dodge(width = 0.4), width = 0.4) +\n geom_errorbar(aes(group = response_type_shared), position = position_dodge(width = 0.4), width = 0) +\n scale_x_continuous(name = \"Region\", breaks = scales::breaks_width(1)) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n scale_fill_brewer(name = \"Mem Type Common\", palette = \"Oranges\", direction = -1) +\n ggpubr::theme_pubclean()\n```\n\n::: {.cell-output-display}\n![Average inter-subject representation similarity among different memory conditions](index_files/figure-html/fig-inter-mem-eff-1.png){#fig-inter-mem-eff width=672}\n:::\n:::\n\n\n# Predict Memory ability\n\nThe indicator calculation is based on [@manns2003].\n\n## Individual-to-group synchronization predicts memory performance\n\n\n::: {#fig-predict-performance .cell .column-page}\n\n```{.r .cell-code}\ntargets::tar_load(mem_perf)\narrow::read_parquet(targets::tar_read(file_rs_group_whole)) |>\n inner_join(mem_perf, by = \"subj_id\", relationship = \"many-to-many\") |>\n filter(mem_type %in% c(\"knowadj\", \"remember\")) |>\n ggplot(aes(fisher_z, dprime, color = mem_type)) +\n geom_point() +\n stat_smooth(method = \"lm\", formula = y ~ x) +\n ggpmisc::stat_correlation(\n ggpmisc::use_label(c(\"r\", \"p.value\")),\n small.r = TRUE,\n small.p = TRUE\n ) +\n scale_color_brewer(palette = \"Dark2\", guide = \"none\") +\n scale_x_continuous(\n name = \"Individual-to-Group Similarity\",\n breaks = scales::breaks_pretty(n = 4)\n ) +\n scale_y_continuous(name = \"d'\") +\n facet_grid(\n rows = vars(mem_type),\n cols = vars(region_id),\n labeller = labeller(\n mem_type = c(\n knowadj = \"Familiarity\",\n remember = \"Recollection\"\n )\n ),\n scales = \"free_x\",\n ) +\n ggpubr::theme_pubr()\n\narrow::read_parquet(targets::tar_read(file_rs_group_trial)) |>\n summarise(\n mean_fisher_z = mean(fisher_z, na.rm = TRUE),\n .by = c(region_id, subj_id)\n ) |>\n inner_join(mem_perf, by = \"subj_id\", relationship = \"many-to-many\") |>\n filter(mem_type %in% c(\"knowadj\", \"remember\")) |>\n ggplot(aes(mean_fisher_z, dprime, color = mem_type)) +\n geom_point() +\n stat_smooth(method = \"lm\", formula = y ~ x) +\n ggpmisc::stat_correlation(\n ggpmisc::use_label(c(\"r\", \"p.value\")),\n small.r = TRUE,\n small.p = TRUE\n ) +\n scale_color_brewer(palette = \"Dark2\", guide = \"none\") +\n scale_x_continuous(\n name = \"Average Individual-to-Group Similarity\",\n breaks = scales::breaks_pretty(n = 4)\n ) +\n scale_y_continuous(name = \"d'\") +\n facet_grid(\n rows = vars(mem_type),\n cols = vars(region_id),\n labeller = labeller(\n mem_type = c(\n knowadj = \"Familiarity\",\n remember = \"Recollection\"\n )\n ),\n scales = \"free_x\",\n ) +\n ggpubr::theme_pubr()\n```\n\n::: {.cell-output-display}\n![Concatenate all trials into one time series](index_files/figure-html/fig-predict-performance-1.png){#fig-predict-performance-1 width=1152}\n:::\n\n::: {.cell-output-display}\n![Average all trial-level synchronization](index_files/figure-html/fig-predict-performance-2.png){#fig-predict-performance-2 width=1152}\n:::\n\nPredict memory performance from individual-to-group synchronization\n:::\n\n\n# References\n",
"markdown": "---\ntitle: Representation Analysis\nauthor:\n - name: Liang Zhang\n - name: Jintao Sheng\nformat:\n html:\n code-fold: true\n toc: true\nexecute:\n warning: false\nbibliography: references.bib\n---\n\n::: {.cell}\n\n```{.r .cell-code}\nlibrary(tidyverse)\n```\n:::\n\n\n# Inter-subject representation similarity\n\n## Abstract vs Concrete\n\n\n::: {#fig-inter-abs-con .cell}\n\n```{.r .cell-code}\ntargets::tar_read(rsa_inter_common_trials) |>\n summarise(\n mean_se(fisher_z),\n .by = c(region_id, word_category)\n ) |>\n ggplot(aes(region_id, y, ymax = ymax, ymin = ymin)) +\n geom_col(aes(fill = word_category), position = position_dodge(width = 0.4), width = 0.4) +\n geom_errorbar(aes(group = word_category), position = position_dodge(width = 0.4), width = 0) +\n scale_x_continuous(name = \"Region\", breaks = scales::breaks_width(1)) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n ggsci::scale_fill_d3(name = \"Word Type\") +\n ggpubr::theme_pubclean()\n\ntargets::tar_read(summary_word_cat_rsa_inter_common_trials_window) |>\n ggplot(aes(window_id, mean_fisher_z)) +\n geom_line(aes(color = word_category, group = word_category)) +\n scale_x_continuous(name = \"Time (ms)\", labels = \\(x) x * 20) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n ggsci::scale_color_d3(name = \"Word Type\") +\n facet_wrap(vars(region_id)) +\n ggpubr::theme_pubclean()\n```\n\n::: {.cell-output-display}\n![Without window](index_files/figure-html/fig-inter-abs-con-1.png){#fig-inter-abs-con-1 width=672}\n:::\n\n::: {.cell-output-display}\n![Dynamic of a trial](index_files/figure-html/fig-inter-abs-con-2.png){#fig-inter-abs-con-2 width=672}\n:::\n\nVerify if intersubject similarity of concrete is larger than that of abstract.\n:::\n\n\n## Subsequent memory effect\n\n\n::: {.cell}\n\n```{.r .cell-code}\ntargets::tar_read(rsa_inter_common_trials) |>\n summarise(\n mean_se(fisher_z),\n .by = c(region_id, response_type_shared)\n ) |>\n ggplot(aes(region_id, y, ymax = ymax, ymin = ymin)) +\n geom_col(aes(fill = response_type_shared), position = position_dodge(width = 0.4), width = 0.4) +\n geom_errorbar(aes(group = response_type_shared), position = position_dodge(width = 0.4), width = 0) +\n scale_x_continuous(name = \"Region\", breaks = scales::breaks_width(1)) +\n scale_y_continuous(name = \"Intersubject Correlation\") +\n scale_fill_brewer(name = \"Mem Type Common\", palette = \"Oranges\", direction = -1) +\n ggpubr::theme_pubclean()\n```\n\n::: {.cell-output-display}\n![Average inter-subject representation similarity among different memory conditions](index_files/figure-html/fig-inter-mem-eff-1.png){#fig-inter-mem-eff width=672}\n:::\n:::\n\n\n# Predict Memory ability\n\nThe indicator calculation is based on [@manns2003].\n\n## Individual-to-group synchronization predicts memory performance\n\n\n::: {#fig-predict-performance .cell .column-page}\n\n```{.r .cell-code}\ntargets::tar_load(mem_perf)\narrow::read_parquet(targets::tar_read(file_rs_group_whole)) |>\n inner_join(mem_perf, by = \"subj_id\", relationship = \"many-to-many\") |>\n filter(mem_type %in% c(\"knowadj\", \"remember\")) |>\n ggplot(aes(fisher_z, dprime, color = mem_type)) +\n geom_point() +\n stat_smooth(method = \"lm\", formula = y ~ x) +\n ggpmisc::stat_correlation(\n ggpmisc::use_label(c(\"r\", \"p.value\")),\n small.r = TRUE,\n small.p = TRUE\n ) +\n scale_color_brewer(palette = \"Dark2\", guide = \"none\") +\n scale_x_continuous(\n name = \"Individual-to-Group Similarity\",\n breaks = scales::breaks_pretty(n = 4)\n ) +\n scale_y_continuous(name = \"d'\") +\n facet_grid(\n rows = vars(mem_type),\n cols = vars(region_id),\n labeller = labeller(\n mem_type = c(\n knowadj = \"Familiarity\",\n remember = \"Recollection\"\n )\n ),\n scales = \"free_x\",\n ) +\n ggpubr::theme_pubr()\n\narrow::read_parquet(targets::tar_read(file_rs_group_trial)) |>\n summarise(\n mean_fisher_z = mean(fisher_z, na.rm = TRUE),\n .by = c(region_id, subj_id)\n ) |>\n inner_join(mem_perf, by = \"subj_id\", relationship = \"many-to-many\") |>\n filter(mem_type %in% c(\"knowadj\", \"remember\")) |>\n ggplot(aes(mean_fisher_z, dprime, color = mem_type)) +\n geom_point() +\n stat_smooth(method = \"lm\", formula = y ~ x) +\n ggpmisc::stat_correlation(\n ggpmisc::use_label(c(\"r\", \"p.value\")),\n small.r = TRUE,\n small.p = TRUE\n ) +\n scale_color_brewer(palette = \"Dark2\", guide = \"none\") +\n scale_x_continuous(\n name = \"Average Individual-to-Group Similarity\",\n breaks = scales::breaks_pretty(n = 4)\n ) +\n scale_y_continuous(name = \"d'\") +\n facet_grid(\n rows = vars(mem_type),\n cols = vars(region_id),\n labeller = labeller(\n mem_type = c(\n knowadj = \"Familiarity\",\n remember = \"Recollection\"\n )\n ),\n scales = \"free_x\",\n ) +\n ggpubr::theme_pubr()\n```\n\n::: {.cell-output-display}\n![Concatenate all trials into one time series](index_files/figure-html/fig-predict-performance-1.png){#fig-predict-performance-1 width=1152}\n:::\n\n::: {.cell-output-display}\n![Average all trial-level synchronization](index_files/figure-html/fig-predict-performance-2.png){#fig-predict-performance-2 width=1152}\n:::\n\nPredict memory performance from individual-to-group synchronization\n:::\n\n\n# References\n",
"supporting": [
"index_files"
],
Expand Down
Binary file modified _freeze/index/figure-html/fig-inter-abs-con-1.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
Binary file modified _freeze/index/figure-html/fig-inter-abs-con-2.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
Binary file modified _freeze/index/figure-html/fig-inter-mem-eff-1.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
Binary file modified _freeze/index/figure-html/fig-predict-performance-1.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.
Binary file modified _freeze/index/figure-html/fig-predict-performance-2.png
Loading
Sorry, something went wrong. Reload?
Sorry, we cannot display this file.
Sorry, this file is invalid so it cannot be displayed.

0 comments on commit 4d494a0

Please sign in to comment.