Por: Katherinne Vallejos Villarreal
Omega <- c(
"(Cara,Sello)","(Cara,Cara)",
"(Sello,Cara)","(Sello,Sello)"
)
Omega
## [1] "(Cara,Sello)" "(Cara,Cara)" "(Sello,Cara)" "(Sello,Sello)"
library(prob)
## Loading required package: combinat
##
## Attaching package: 'combinat'
## The following object is masked from 'package:utils':
##
## combn
## Loading required package: fAsianOptions
## Loading required package: timeDate
## Loading required package: timeSeries
## Loading required package: fBasics
## Loading required package: fOptions
##
## Attaching package: 'prob'
## The following objects are masked from 'package:base':
##
## intersect, setdiff, union
tosscoin(2, makespace = T)
f <- function(x) (Cara-abs(Sello-x))/4
p <- 1/length(Omega)
cat("La probabilidad para cada punto muestral es: ", p)
## La probabilidad para cada punto muestral es: 0.25