setwd("/cloud/project")

# Cargar datos
datos <- read.csv("Depositos_Sulfuro.csv", header = TRUE, sep = ";", dec = ".")

# 1. Extraer variable tipo de depósito
Tipo_Deposito <- datos$deptype

# Reemplazar NA por "Sin Registro"
TipoDep_limpio <- ifelse(is.na(Tipo_Deposito) | trimws(Tipo_Deposito) == "",
                         "Sin Registro",
                         trimws(Tipo_Deposito))

TIPODEPOSITO <- factor(TipoDep_limpio)

# 2. Tabla de frecuencia (ni)
TablaTIPODEPOSITO <- as.data.frame(table(TIPODEPOSITO))
colnames(TablaTIPODEPOSITO) <- c("TIPODEPOSITO", "ni")

# 3. Porcentaje inicial
TablaTIPODEPOSITO$hi_porc <- (TablaTIPODEPOSITO$ni / sum(TablaTIPODEPOSITO$ni)) * 100


# Formatear a 2 decimales
TablaTIPODEPOSITO$hi_porc <- round(TablaTIPODEPOSITO$hi_porc, 2)

# 4. Fila TOTAL con 100.00
Total <- data.frame(
  TIPODEPOSITO = "TOTAL",
  ni = sum(TablaTIPODEPOSITO$ni),
  hi_porc = 100.00
)

# 5. Tabla final
TablaFinal <- rbind(TablaTIPODEPOSITO, Total)

print(TablaFinal)
##    TIPODEPOSITO   ni hi_porc
## 1 Bimodal-Mafic  358   32.84
## 2        Felsic  529   48.53
## 3         Mafic  202   18.53
## 4  Sin Registro    1    0.09
## 5         TOTAL 1090  100.00