Welcome to this presentation on point estimation, a core concept in statistical inference.
We will explore how to estimate population parameters using sample data.
2025-11-17
Welcome to this presentation on point estimation, a core concept in statistical inference.
We will explore how to estimate population parameters using sample data.
The sample mean is a point estimator of the population mean \(\mu\).
It is computed as: \[ \hat{\mu} = \bar{x} = \frac{1}{n} \sum_{i=1}^{n} x_i \]
Properties:
The sample variance estimates the population variance \(\sigma^2\).
For a sample \(x_1, x_2, \ldots, x_n\): \[ \hat{\sigma}^2 = \frac{1}{n} \sum_{i=1}^{n} (x_i - \bar{x})^2 \]
Note:
set.seed(123) data <- rnorm(100, mean = 50, sd = 10)
mean(data)
## [1] 50.90406
var(data)
## [1] 83.32328
library(MASS) mle_fit <- fitdistr(data, "normal") mle_fit
## mean sd ## 50.9040591 9.0824033 ## ( 0.9082403) ( 0.6422229)
library(ggplot2)
sample_mean <- mean(data)
ggplot(data.frame(x = data), aes(x = x)) +
geom_histogram(binwidth = 5, fill = "beige", color = "black") +
geom_vline(aes(xintercept = sample_mean),
color = "tan", linewidth = 1) +
labs(title = "Histogram of Sample Data",
x = "Value", y = "Count")
set.seed(123)
sample_means <- replicate(1000,
mean(rnorm(50, mean = 50, sd = 10)))
library(ggplot2)
ggplot(data.frame(mean = sample_means), aes(x = mean)) +
geom_histogram(binwidth = 1, fill = "beige", color = "tan") +
labs(title = "Sampling Distribution of the Sample Mean",
x = "Sample Mean", y = "Frequency")
library(plotly)
## ## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2': ## ## last_plot
## The following object is masked from 'package:MASS': ## ## select
## The following object is masked from 'package:stats': ## ## filter
## The following object is masked from 'package:graphics': ## ## layout
plot_ly(x = data, type = "histogram") %>%
layout(
title = "Interactive Histogram of Sample Data",
xaxis = list(title = "Value"),
yaxis = list(title = "Count")
)