Untitled

Quarto

Quarto enables you to weave together content and executable code into a finished document. To learn more about Quarto see https://quarto.org.

Running Code

When you click the Render button a document will be generated that includes both content and the output of embedded code. You can embed code like this:

library(readxl)
data <-read_excel ("C:/Users/PC/Desktop/1978-2024全国人口数据.xlsx", sheet = "Sheet2")
years <- as.numeric(data$指标)
population <- as.numeric(data$`年末总人口(万人)`)
pearl_curve <- function(t, L, a, b) {
return(L / (1 + a * exp(-b * t)))
}
fit <- nls(population ~ pearl_curve(years-1978, L, a, b), start = list(L = max(population) *1.1, a = 10, b = 0.05))
summary(fit)

Formula: population ~ pearl_curve(years - 1978, L, a, b)

Parameters:
   Estimate Std. Error t value Pr(>|t|)    
L 1.506e+05  6.795e+02  221.68   <2e-16 ***
a 5.843e-01  5.820e-03  100.40   <2e-16 ***
b 5.038e-02  1.133e-03   44.46   <2e-16 ***
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 566.4 on 43 degrees of freedom

Number of iterations to convergence: 9 
Achieved convergence tolerance: 3.085e-06
L_fit <- coef(fit)[["L"]]
a_fit <- coef(fit)[["a"]]
b_fit <- coef(fit)[["b"]]
future_years <- 2024:2030
predicted_population <- pearl_curve(future_years - 1978, L_fit, a_fit, b_fit)
plot(years, population, type = "p", pch = 16, xlab = "Year", ylab = "Population", main = "Population Growth Model")
lines(years, predict(fit), col = "blue", lwd = 2)
points(future_years, predicted_population, type = "p", pch = 17, col = "red")
legend("topleft", legend = c("Observed Data", "Fitted Curve", "Predicted Data"), pch = c(16, NA, 17), lty = c(NA, 1, NA), col = c("black", "blue", "red"))

我国人口发展特点:

  1. 人口规模庞大: 我国是世界上人口最多的国家,长期以来人口数量一直处于高位。

  2. 人口增长速度变化: 20世纪中期至末期,我国人口增长迅速。1970年代末和1980年代初实施计划生育政策后,人口增长速度显著放缓。

  3. 老龄化加剧: 随着医疗条件和生活水平的提高,平均寿命延长,老龄人口比例逐年增加。老龄化社会带来了养老、医疗等方面的挑战。

  4. 出生率和生育率下降: 近年来,受经济发展、城市化进程、教育水平提高及育儿成本增加等因素影响,出生率和总生育率都有明显下降趋势。

  5. 城乡人口分布变化: 随着城市化进程的加快,越来越多的人口从农村转移到城市。大城市和特大城市的人口迅速增长,出现了人口密度高的城市群。

  6. 地区差异明显: 不同地区的人口发展有显著差异。东部沿海地区人口密集,经济发达;中西部地区和东北人口增长相对缓慢,有些区域甚至出现人口负增长。

  7. 人口政策调整: 随着社会经济的发展,我国的人口政策不断调整。从“独生子女政策”到“单独二孩政策”,再到“全面二孩政策”,以应对人口结构变化和社会需求。

  8. 劳动年龄人口变化: 劳动年龄人口(15-64岁)总量庞大,但近年来比例下降。年轻劳动力减少,老龄劳动力增加,对劳动力市场和经济发展带来压力。

  9. 迁移和流动: 国内人口流动性增强,特别是跨省迁移。大量农村人口涌入城市,形成了规模庞大的流动人口,有时也被称为“农民工”。

  10. 教育水平提高: 人口素质显著提高,受教育年限和教育水平不断上升。这对经济转型和社会发展有积极影响。

You can add options to executable code like this

library(readxl)
d1 <-read_excel ("C:/Users/PC/Desktop/1978-2022广东省人口数据.xls", sheet = "Sheet2")
year<-as.numeric(d1$年份)
populations<-as.numeric(d1$总人口)
pearl_curve <- function(t, L, a, b) {
return(L / (1 + a * exp(-b * t)))
}
fit1 <- nls(populations ~ pearl_curve(year-1978, L1, a1, b1), start = list(L1 = max(populations)*1.1 , a1 = 10, b1 = 0.05))
summary(fit)

Formula: population ~ pearl_curve(years - 1978, L, a, b)

Parameters:
   Estimate Std. Error t value Pr(>|t|)    
L 1.506e+05  6.795e+02  221.68   <2e-16 ***
a 5.843e-01  5.820e-03  100.40   <2e-16 ***
b 5.038e-02  1.133e-03   44.46   <2e-16 ***
---
Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

Residual standard error: 566.4 on 43 degrees of freedom

Number of iterations to convergence: 9 
Achieved convergence tolerance: 3.085e-06
L1 <- coef(fit)[["L"]]
a1 <- coef(fit)[["a"]]
b1 <- coef(fit)[["b"]]
future_year <- 2024:2030
predicted_populations <- pearl_curve(future_years - 1978, L_fit, a_fit, b_fit)
plot(year, populations, type = "p", pch = 16, xlab = "Year", ylab = "Population", main = "Population Growth Model")
lines(year, predict(fit1), col = "blue", lwd = 2)
points(future_year, predicted_populations, type = "p", pch = 17, col = "red")
legend("topleft", legend = c("Observed Data", "Fitted Curve", "Predicted Data"), pch = c(16, NA, 17), lty = c(NA, 1, NA), col = c("black", "blue", "red"))

广东省人口发展特点:

  1. 人口规模庞大: 广东省的人口总量长期处于全国前列,是中国人口最多的省份之一。根据国家统计局的数据,广东省的人口在近年来已经突破1亿,是中国唯一一个人口超过1亿的省份。

  2. 强大的吸引力 广东省特别是珠三角地区(如广州、深圳、东莞)对外来人口有很大的吸引力。经济发达、就业机会多、生活条件好,使得大量人口从全国各地迁入广东。

  3.  高水平的城市化 广东省的城市化率较高,尤其是珠三角地区的城市化水平远高于全国平均水平。大城市和特大城市如广州和深圳吸引了大量流动人口。

  4.  经济发展驱动 广东省经济发达,是中国的经济中心之一。制造业、服务业和高科技产业的发展带动了人口的流入和增长。经济发展的动力在很大程度上来自于外来人口的贡献。

  5.  老龄化趋势 尽管广东省年轻人口较多,但随着全国老龄化趋势的加剧,广东省也面临着老龄化的挑战。特别是在一些经济较发达的地区,老龄人口比例逐渐增加。

  6.  劳动力市场 广东省是中国的制造业中心,吸引了大量的劳动力,特别是年轻的、具有一定技能的劳动力。劳动力市场的供需情况也影响着人口的流动和变化。

  7.  教育水平 广东省的教育水平在不断提高,特别是在珠三角地区,教育资源丰富,吸引了大量人才。同时,外来务工人员的子女教育问题也成为关注的重点。

  8.  人口政策的影响 广东省也受益于全国范围内的人口政策调整,如“单独二孩政策”和“全面二孩政策”。这些政策在一定程度上影响了人口的出生率和人口结构。

  9.  流动人口管理 广东省的流动人口数量庞大,如何管理和服务这些流动人口成为一个重要的社会问题。政府在住房、医疗、教育等方面需要做出相应的安排和政策。

  10.  区域差异 虽然整体上广东省人口密度高,但不同地区之间存在明显差异。珠三角地区人口稠密,而粤西、粤北等区域人口密度相对较低。

The echo: false option disables the printing of code (only output is displayed).