跟着Nature Communications学作图:纹理柱状图+添加显著性标签!

news2024/11/29 22:40:39

📋文章目录

  • 复现图片
  • 设置工作路径和加载相关R包
  • 读取数据集
  • 数据可视化
    • 计算均值和标准差
  • 计算均值和标准差
    • 方差分析
    • 组间t-test
  • 图a可视化过程
  • 图b可视化过程
  • 合并图ab

   跟着「Nature Communications」学作图,今天主要通过复刻NC文章中的一张主图来巩固先前分享过的知识点,比如纹理柱状图、 添加显著性标签、拼图等,其中还会涉及数据处理的相关细节和具体过程。

复现图片

在这里插入图片描述

在这里插入图片描述
主要复现红框部分,右侧的cd图与框中的图是同类型的,只不过需要构建更多数据相对麻烦,所以选择以左侧红框图进行学习和展示。

设置工作路径和加载相关R包

rm(list = ls()) # 清空当前环境变量
setwd("C:/Users/Zz/Desktop/公众号 SES") # 设置工作路径
# 加载R包
library(ggplot2)
library(agricolae)
library(ggpattern)
library(ggpubr)

读取数据集

cData1 <- read.csv("cData1.csv", header = T, row.names = 1)
head(cData1)
#   Type   Deep ctValue ftValue Stripe_Angle
# 1   BT    Top      55      73          135
# 2   BT    Top      61      78          135
# 3   BT    Top      69      80          135
# 4   BT Center      35      50          135
# 5   BT Center      42      41          135
# 6   BT Center      43      57          135

数据包括以下指标:2个分类变量、2个数值变量、和1个整数变量。

数据可视化

在可视化前,我们需要先思考图中构成的元素,由哪些组成。

  • 计算每个分组或处理下的均值和标准差;
  • 进行组内的方差分析及多重比较;
  • 进行组间的t检验;

计算均值和标准差

cData1_mean <- cData1 %>% 
  gather(key = "var_type", value = "value",
         3:4) %>% 
  group_by(Type, Deep, var_type, Stripe_Angle) %>%  
  summarise(mean = mean(value),
            sd = sd(value))
cData1_mean  
# A tibble: 12 × 6
# Groups:   Type, Deep, var_type [12]
# Type  Deep   var_type Stripe_Angle  mean    sd
# <fct> <chr>  <chr>           <int> <dbl> <dbl>
# 1 BT    Bottom ctValue           135  47.7  1.53
# 2 BT    Bottom ftValue           135  48    1   
# 3 BT    Center ctValue           135  40    4.36
# 4 BT    Center ftValue           135  49.3  8.02
# 5 BT    Top    ctValue           135  61.7  7.02
# 6 BT    Top    ftValue           135  77    3.61
# 7 CK    Bottom ctValue           135  42    7.21
# 8 CK    Bottom ftValue           135  48    4.36
# 9 CK    Center ctValue           135  38.3  2.08
# 10 CK    Center ftValue           135  47.7  5.13
# 11 CK    Top    ctValue           135  46.7  7.57
# 12 CK    Top    ftValue           135  53.7 12.3 

计算均值和标准差

cData_summary <- cData %>%
  group_by(Weeks, Type) %>%
  summarise(
    avg_lfValue = mean(lfValue),
    sd_lfValue = sd(lfValue),
    avg_rgValue = mean(rgValue),
    sd_rgValue = sd(rgValue),
  )
cData_summary
# Weeks Type               avg_lfValue sd_lfValue avg_rgValue sd_rgValue
# <dbl> <chr>                    <dbl>      <dbl>       <dbl>      <dbl>
# 1    20 By week of onset         2623.       25.2        1.98     0.0764
# 2    20 By week of testing       2500        50          1.42     0.104 
# 3    21 By week of onset         3543.       40.4        1.74     0.0361
# 4    21 By week of testing       2737.       51.3        1.21     0.0361
# 5    22 By week of onset         2770        26.5        1.28     0.0300
# 6    22 By week of testing       2160        60          1.10     0.0839
# 7    23 By week of onset         2143.       40.4        1.31     0.0208
# 8    23 By week of testing       1777.       75.1        1.02     0.0153
# 9    24 By week of onset         1823.       25.2        1.15     0.0300
# 10    24 By week of testing       1667.       61.1        1.07     0.0265
# 11    25 By week of onset         1690        36.1        1.23     0.0208
# 12    25 By week of testing       1610        36.1        1.2      0.0300
# 13    26 By week of onset         1607.       30.6        1.18     0.0252
# 14    26 By week of testing       1673.       30.6        1.16     0.0361

方差分析

# 方差分析
groups <- NULL
vl <- unique((cData1 %>% 
                gather(key = "var_type", value = "value", 3:4) %>% 
                unite("unique_col", c(Type, var_type), sep = "-"))$unique_col)
vl

for(i in 1:length(vl)){
  df <- cData1 %>% 
    gather(key = "var_type", value = "value", 3:4) %>% 
    unite("unique_col", c(Type, var_type), sep = "-") %>% 
    filter(unique_col == vl[i])
  aov <- aov(value ~ Deep, df)
  lsd <- LSD.test(aov, "Deep", p.adj = "bonferroni") %>%
    .$groups %>% mutate(Deep = rownames(.),
                        unique_col = vl[i]) %>%
    dplyr::select(-value) %>% as.data.frame()
  groups <- rbind(groups, lsd)
}
groups <- groups %>% separate(unique_col, c("Type", "var_type"))
groups
#         groups   Deep Type var_type
# Top          a    Top   BT  ctValue
# Bottom       b Bottom   BT  ctValue
# Center       b Center   BT  ctValue
# Top1         a    Top   CK  ctValue
# Bottom1      a Bottom   CK  ctValue
# Center1      a Center   CK  ctValue
# Top2         a    Top   BT  ftValue
# Center2      b Center   BT  ftValue
# Bottom2      b Bottom   BT  ftValue
# Top3         a    Top   CK  ftValue
# Bottom3      a Bottom   CK  ftValue
# Center3      a Center   CK  ftValue

使用aov函数和LSD.test函数实现方差分析及对应的多重比较,并提取显著性字母标签。

然后将多重比较的结果与原均值标准差的数据进行合并:

cData1_mean1 <- left_join(cData1_mean, groups, by = c("Deep", "Type", "var_type")) %>% 
  arrange(var_type) %>% group_by(Type, var_type) %>% 
  mutate(label_to_show = n_distinct(groups))
cData1_mean1
# A tibble: 12 × 8
# Groups:   Type, var_type [4]
# Type  Deep   var_type Stripe_Angle  mean    sd groups label_to_show
# <chr> <chr>  <chr>           <int> <dbl> <dbl> <chr>          <int>
# 1 BT    Bottom ctValue           135  47.7  1.53 b                  2
# 2 BT    Center ctValue           135  40    4.36 b                  2
# 3 BT    Top    ctValue           135  61.7  7.02 a                  2
# 4 CK    Bottom ctValue           135  42    7.21 a                  1
# 5 CK    Center ctValue           135  38.3  2.08 a                  1
# 6 CK    Top    ctValue           135  46.7  7.57 a                  1
# 7 BT    Bottom ftValue           135  48    1    b                  2
# 8 BT    Center ftValue           135  49.3  8.02 b                  2
# 9 BT    Top    ftValue           135  77    3.61 a                  2
# 10 CK    Bottom ftValue           135  48    4.36 a                  1
# 11 CK    Center ftValue           135  47.7  5.13 a                  1
# 12 CK    Top    ftValue           135  53.7 12.3  a                  1
  • 需要注意的是:这里添加了label_to_show一列,目的是为了后续再进行字母标签添加时可以识别没有显著性的结果。

组间t-test

cData1_summary <- cData1 %>%
  gather(key = "var_type", value = "value", 3:4) %>% 
  # unite("unique_col", c(Type, Deep), sep = "-") %>% unique_col
  group_by(Deep, var_type) %>%
  summarize(
    p_value = round(t.test(value ~ Type)$p.value, 2)
  ) %>%
  mutate(
    label = ifelse(p_value <= 0.001, "***",
                   ifelse(p_value <= 0.01, "**", 
                          ifelse(p_value <= 0.05, "*", 
                                 ifelse(p_value <= 0.1, "●", NA))))
  )
cData1_summary
# Deep   var_type p_value label
# <chr>  <chr>      <dbl> <chr>
# 1 Bottom ctValue     0.31 NA   
# 2 Bottom ftValue     1    NA   
# 3 Center ctValue     0.59 NA   
# 4 Center ftValue     0.78 NA   
# 5 Top    ctValue     0.07 ●    
# 6 Top    ftValue     0.07 ● 

我们将计算出来的p值,并用* 或者 ●进行了赋值。然后合并相关结果:

cData1_summary1 <- left_join(cData1_mean1, cData1_summary, by = c("Deep", "var_type"))
cData1_summary1
# Type  Deep   var_type Stripe_Angle  mean    sd groups label_to_show p_value label
# <chr> <chr>  <chr>           <int> <dbl> <dbl> <chr>          <int>   <dbl> <chr>
# 1 BT    Bottom ctValue           135  47.7  1.53 b                  2    0.31 NA   
# 2 BT    Center ctValue           135  40    4.36 b                  2    0.59 NA   
# 3 BT    Top    ctValue           135  61.7  7.02 a                  2    0.07 ●    
# 4 CK    Bottom ctValue           135  42    7.21 a                  1    0.31 NA   
# 5 CK    Center ctValue           135  38.3  2.08 a                  1    0.59 NA   
# 6 CK    Top    ctValue           135  46.7  7.57 a                  1    0.07 ●    
# 7 BT    Bottom ftValue           135  48    1    b                  2    1    NA   
# 8 BT    Center ftValue           135  49.3  8.02 b                  2    0.78 NA   
# 9 BT    Top    ftValue           135  77    3.61 a                  2    0.07 ●    
# 10 CK    Bottom ftValue           135  48    4.36 a                  1    1    NA   
# 11 CK    Center ftValue           135  47.7  5.13 a                  1    0.78 NA   
# 12 CK    Top    ftValue           135  53.7 12.3  a                  1    0.07 ● 
  • 需要注意的是:添加的label也是为了后续筛选掉没有显著性结果做准备。

图a可视化过程

ctValue <- ggplot(
  data = cData1_mean1 %>% 
    filter(var_type == "ctValue") %>% 
    mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))), 
  aes(x = Type, y = mean, fill = Deep, pattern = Type, width = 0.75)
  ) +
  
  geom_bar_pattern(
    position = position_dodge(preserve = "single"),
    stat = "identity",
    pattern_fill = "white", 
    pattern_color = "white", 
    pattern_angle = -50,
    pattern_spacing = 0.05,
    color = "grey",
    width = 0.75
    ) +
  scale_pattern_manual(
    values = c(CK = "stripe", BT = "none")
    ) +
  
  geom_errorbar(
    data = cData1_mean %>% 
      filter(var_type == "ctValue") %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))), 
    aes(x = Type, y = mean, ymin = mean - sd, ymax = mean + sd, width = 0.2),
    position = position_dodge(0.75),
    )+

  geom_point(
    data = cData1 %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))),
    aes(x = Type, y = ctValue, group = Deep), color = "black", fill = "#D2D2D2", shape = 21,
    position = position_dodge(0.75), size = 3
    )+
  
  geom_text(
    data = cData1_mean1 %>% 
      filter(var_type == "ctValue",
             label_to_show > 1) %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))),
    aes(x = Type, y = mean + sd, label = groups), 
    position = position_dodge(0.75), vjust = -0.5, size = 5
    ) +
  
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ctValue"),
    aes(x = 0.75, xend = 0.75, y = 73, yend = 76)
  )+
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ctValue"),
    aes(x = 0.75, xend = 1.75, y = 76, yend = 76)
  )+
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ctValue"),
    aes(x = 1.75, xend = 1.75, y = 73, yend = 76)
  )+
  
  geom_text(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ctValue"),
    aes(x = 1.25, y = 76, label = paste0("p = ", p_value)),
    vjust = -0.5, size = 5
    )+
  
  geom_text(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ctValue"),
    aes(x = 1.25, y = 78, label = label),
    vjust = -1, size = 5
  )+
  
  scale_fill_manual(
    values = c("#393939", "#A2A2A2", "#CCCCCC")
    ) +
    
  scale_y_continuous(
    expand = c(0, 0), limits = c(0, 100), breaks = seq(0, 100, 50)
    ) +

  theme_classic()+
  theme(
    legend.position = "top",
        axis.ticks.length.y = unit(0.2, "cm"),
        axis.text.y = element_text(color = "black", size = 12),
        axis.title.y = element_text(color = "black", size = 12, face = "bold"),
        axis.title.x = element_blank(),
        axis.text.x = element_blank(),
        axis.line.x = element_blank(),
        axis.ticks.x = element_blank(),
    plot.margin = margin(t = 0, r = 0, b = 1, l = 0, "lines")
    )+
  labs(y = "CTvalue", fill = "", pattern = "");ctValue

在这里插入图片描述

图b可视化过程

ftValue <- ggplot(
  data = cData1_mean1 %>% 
    filter(var_type == "ftValue") %>% 
    mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))), 
  aes(x = Type, y = mean, fill = Deep, pattern = Type, width = 0.75)
) +
  
  geom_bar_pattern(
    position = position_dodge(preserve = "single"),
    stat = "identity",
    pattern_fill = "white", 
    pattern_color = "white", 
    pattern_angle = -50,
    pattern_spacing = 0.05,
    color = "grey",
    width = 0.75
  ) +
  scale_pattern_manual(
    values = c(CK = "stripe", BT = "none")
  ) +
  
  geom_errorbar(
    data = cData1_mean %>% 
      filter(var_type == "ftValue") %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))), 
    aes(x = Type, y = mean, ymin = mean - sd, ymax = mean + sd, width = 0.2),
    position = position_dodge(0.75),
  )+
  
  geom_point(
    data = cData1 %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))),
    aes(x = Type, y = ftValue, group = Deep), color = "black", fill = "#D2D2D2", shape = 21,
    position = position_dodge(0.75), size = 3
  )+
  
  geom_text(
    data = cData1_mean1 %>% 
      filter(var_type == "ftValue",
             label_to_show > 1) %>% 
      mutate(Deep = factor(Deep, levels = c("Top", "Center", "Bottom"))),
    aes(x = Type, y = mean + sd, label = groups), 
    position = position_dodge(0.75), vjust = -0.5, size = 5
  ) +
  
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ftValue"),
    aes(x = 0.75, xend = 0.75, y = 85, yend = 88)
  )+
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ftValue"),
    aes(x = 0.75, xend = 1.75, y = 88, yend = 88)
  )+
  geom_segment(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ftValue"),
    aes(x = 1.75, xend = 1.75, y = 85, yend = 88)
  )+
  
  geom_text(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ftValue"),
    aes(x = 1.25, y = 88, label = paste0("p = ", p_value)),
    vjust = -0.5, size = 5
  )+
  
  geom_text(
    data = cData1_summary1 %>% 
      filter(p_value <= 0.1 & var_type == "ftValue"),
    aes(x = 1.25, y = 90, label = label),
    vjust = -1, size = 5
  )+
  
  scale_fill_manual(
    values = c("#393939", "#A2A2A2", "#CCCCCC")
  ) +
  
  scale_y_continuous(
    expand = c(0, 0), limits = c(0, 100), breaks = seq(0, 100, 50)
  ) +
  
  theme_classic()+
  theme(
    legend.position = "top",
    axis.ticks.length.y = unit(0.2, "cm"),
    axis.text.y = element_text(color = "black", size = 12),
    axis.title.y = element_text(color = "black", size = 12, face = "bold"),
    axis.title.x = element_blank(),
    axis.text.x = element_blank(),
    axis.line.x = element_blank(),
    axis.ticks.x = element_blank()
  )+
  labs(y = "FTvalue", fill = "", pattern = "");ftValue

在这里插入图片描述

合并图ab

ggarrange(ctValue, ftValue, nrow = 2, ncol = 1, labels = c ("A", "B"),
          align = "hv", common.legend = T)

在这里插入图片描述
使用ggpubr包中的ggarrange函数完成拼图。

复现效果还是比较完美的。中间可视化代码细节比较多,大家可以自行学习,可以留言提问答疑。

本文来自互联网用户投稿,该文观点仅代表作者本人,不代表本站立场。本站仅提供信息存储空间服务,不拥有所有权,不承担相关法律责任。如若转载,请注明出处:http://www.coloradmin.cn/o/1159714.html

如若内容造成侵权/违法违规/事实不符,请联系多彩编程网进行投诉反馈,一经查实,立即删除!

相关文章

基础课15——语音标注

语音数据标注是对语音数据进行处理和分析的过程&#xff0c;目的是让人工智能系统能够理解和识别语音中的信息。这个过程包括了对语音信号的预处理、特征提取、标注等步骤。 在语音数据标注中&#xff0c;标注员需要对语音数据进行分类、切分、转写等操作&#xff0c;让人工智…

C++ 多线程之OpenMP并行编程使用详解

C 多线程之OpenMP并行编程使用详解 总结OpenMP使用详解本文转载自&#xff1a;https://blog.csdn.net/AAAA202012/article/details/123665617?spm1001.2014.3001.5506 1.总览 OpenMP(Open Multi-Processing)是一种用于共享内存并行系统的多线程程序设计方案&#xff0c;支持…

软件测试之用例篇(万能公式、具体方法)

目录 1. 概念 2. 万能公式 3.具体设计测试用例的方法 &#xff08;1&#xff09;等价类 &#xff08;2&#xff09;边界值 &#xff08;3&#xff09;判定表(因果图) &#xff08;4&#xff09;场景设计法 &#xff08;5&#xff09;正交法 如何使用 allparis 生成正交…

绕开网站反爬虫原理及实战

1.摘要 在本文中,我首先对网站常用的反爬虫和反自动化技术做了一个梳理, 并对可能能够绕过这些反爬技术的开源库chromedp所使用的技术分拆做一个介绍, 最后利用chromedp库对一个测试网站做了爬虫测试, 并利用chromedp库绕开了爬虫限制,成功通过程序自动获取到信息。在测试过程…

基站/手机是怎么知道信道情况的?

在无线通信系统中&#xff0c;信道的情况对信号的发送起到至关重要的作用&#xff0c;基站和手机根据信道的情况选择合适的资源配置和发送方式进行通信&#xff0c;那么基站或者手机是怎么知道信道的情况呢&#xff1f; 我们先来看生活中的一个例子&#xff0c;从A地发货到B地…

小程序如何设置自动预约快递

小程序通过设置自动预约功能&#xff0c;可以实现自动将订单信息发送给快递公司&#xff0c;快递公司可以自动上门取件。下面具体介绍如何设置。 在小程序管理员后台->配送设置处&#xff0c;选择首选配送公司。为了能够支持自动预约快递&#xff0c;请选择正常的快递公司&…

vue3写nav滚动事件中悬停在顶部

1. 防抖类Animate, 使用requestAnimationFrame代替setTimeout 也可以使用节流函数, lodash有现成的防抖和节流方法 _.debounce防抖 _.throttle节流 export default class Animate {constructor() {this.timer null;}start (fn) > {if (!fn) {throw new Error(需要执行…

力扣:147. 对链表进行插入排序(Python3)

题目&#xff1a; 给定单个链表的头 head &#xff0c;使用 插入排序 对链表进行排序&#xff0c;并返回 排序后链表的头 。 插入排序 算法的步骤: 插入排序是迭代的&#xff0c;每次只移动一个元素&#xff0c;直到所有元素可以形成一个有序的输出列表。每次迭代中&#xff0c…

解决在Win7下运行一些老游戏花屏或色彩异常问题的方法

有一些喜欢回顾经典老游戏的玩家们&#xff0c;在目前最新的windows7的操作系统下&#xff0c;运行某些游戏会出现花屏&#xff0c;问题的原因是因为win7对这些游戏的DirectDraw不兼容&#xff0c;一种方法是改游戏配置文件&#xff0c;把游戏色彩8bit改成16bit&#xff0c;当然…

安装pytorch报错torch.cuda.is_available()=false的解决方法

参考文章&#xff1a; https://blog.csdn.net/qq_46126258/article/details/112708781 https://blog.csdn.net/Andy_Luke/article/details/122503884 https://blog.csdn.net/anmin8888/article/details/127910084 https://blog.csdn.net/zcs2632008/article/details/127025294 …

为什么Facebook运营需使用IP代理?有哪些美国IP代理好用?

随着互联网的快速发展和全球用户规模的不断增长&#xff0c;Facebook已成为了全球最大的社交媒体平台之一。然而&#xff0c;大批量地运营Facebook账号往往需要借助IP代理这一工具&#xff0c;提高账号的安全性和可靠性&#xff0c;使得运营Facebook更加流畅。那么Facebook为什…

嵌入式到底如何理解呢?

今日话题&#xff0c;嵌入式到底如何理解呢&#xff1f;以我个人的理解&#xff0c;可以用一个客观的比喻来描述&#xff0c;就是将某个系统嵌入到特定的环境中&#xff0c;以实现特定的功能。这个过程包括将现实世界中的人、物的意图和逻辑关系&#xff0c;通过计算和运算的方…

【计算机网络】同源策略及跨域问题

1. 同源策略 同源策略是一套浏览器安全机制&#xff0c;当一个源的文档和脚本&#xff0c;与另一个源的资源进行通信时&#xff0c;同源策略就会对这个通信做出不同程度的限制。 同源策略对 同源资源 放行&#xff0c;对 异源资源 限制。因此限制造成的开发问题&#xff0c;称…

【Acwing170】加成序列(dfs+迭代加深+剪枝)题解和一点感想

本思路来自acwing算法提高课 题目描述 看本文需要准备的知识 1.dfs算法基本思想 2.对剪枝这个词有个简单的认识 迭代加深思想和此题分析 首先&#xff0c;什么是迭代加深呢&#xff1f;当一个问题的解有很大概率出现在递归树很浅的层&#xff0c;但是这个问题的解本身存在…

树结构及其算法-用数组来实现二叉树

目录 树结构及其算法-用数组来实现二叉树 C代码 树结构及其算法-用数组来实现二叉树 使用有序的一维数组来表示二叉树&#xff0c;首先可将此二叉树假想成一棵满二叉树&#xff0c;而且第层具有个节点&#xff0c;按序存放在一维数组中。首先来看看使用一维数组建立二叉树的…

Java使用pdfbox进行pdf和图片之间的转换

简介 pdfbox是Apache开源的一个项目,支持pdf文档操作功能。 官网地址: Apache PDFBox | A Java PDF Library 支持的功能如下图.引入依赖 <dependency><groupId>org.apache.pdfbox</groupId><artifactId>pdfbox-app</artifactId><version>…

这样发布成绩,轻松没烦恼

老师们&#xff0c;你知道怎样公正、便捷发布学生成绩吗&#xff1f;今天我来教给大家一个超级实用的方法&#xff0c;成绩发布简单又轻松&#xff01; 成绩查询系统主要是学校和教师使用。能够实现学生成绩的录入、查询、发布和导出等功能&#xff0c;让老师告别传统操作&…

深入理解元素的高度、行高、行盒和vertical-align

1.块级元素的高度 当没有设置高度时&#xff0c;高度由内容撑开&#xff0c;实际上是由行高撑开&#xff0c;当有多行时&#xff0c;高度为每行的行高高度之和。 行高为什么存在&#xff1f; 因为每行都由一个行盒包裹&#xff0c;行高实际上是行盒的高度。 2.什么是行盒&am…

模糊C均值聚类(FCM)python

目录 一、模糊C均值聚类的原理 二、不使用skfuzzy的python代码 三、 使用skfuzzy的python代码 一、模糊C均值聚类的原理 二、不使用skfuzzy的python代码 import numpy as np import random import matplotlib.pyplot as plt plt.rcParams[font.sans-serif][SimHei] plt.r…

记录 vue + vuetify + electron 安装过程

NodeJs 版本&#xff1a; 20 内容来自&#xff1a; Electron Vue.js Vuetify 构建跨平台应用_思月行云的博客-CSDN博客文章浏览阅读61次。Go coding!https://blog.csdn.net/kenkao/article/details/132600542 npm config set registry https://registry.npm.taobao.org np…