library(sqldf)
## Warning: package 'sqldf' was built under R version 4.2.3
## Loading required package: gsubfn
## Warning: package 'gsubfn' was built under R version 4.2.3
## Loading required package: proto
## Warning: package 'proto' was built under R version 4.2.3
## Loading required package: RSQLite
## Warning: package 'RSQLite' was built under R version 4.2.3
library(readxl)
library(readr)
## Warning: package 'readr' was built under R version 4.2.3
library(xtable)
## Warning: package 'xtable' was built under R version 4.2.3
covid19identificado <- read_csv("C:/Users/nicol/Downloads/covid19identificado.csv")
## New names:
## • `` -> `...1`
## Warning: One or more parsing issues, call `problems()` on your data frame for details,
## e.g.:
##   dat <- vroom(...)
##   problems(dat)
## Rows: 46019 Columns: 56
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr  (3): OCUPACION, CAUSA_MULT, C_BAS1
## dbl (49): ...1, COD_DPTO, COD_MUNIC, A_DEFUN, SIT_DEFUN, TIPO_DEFUN, ANO, ME...
## lgl  (4): OTRSITIODE, CODOCUR, CODMUNOC, C_MUERTEE
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
##################################################################### ;
##################################################################### ;
######################## General

# Usando la poblacion en riesgo como la resigstrada en la base de datos nofetal2020
# Usando la poblacion estandar como la proyectada en DANE

A <- sqldf("select   GRU_ED2, count(GRU_ED2) as CantidadMuertes
             from     covid19identificado
             group by GRU_ED2")
tot <- sum(A$CantidadMuertes)

A <- rbind(c("Total",tot),A)
A
##   GRU_ED2 CantidadMuertes
## 1   Total           46019
## 2       1              60
## 3       2              30
## 4       3              36
## 5       4            2670
## 6       5           12176
## 7       6           31047
pop_edad_general <- read_excel("C:/Users/nicol/Downloads/pop edad general.xlsx")
pop_edad_general <- data.frame("Poblacion"=c(
  "Total" = pop_edad_general$Total[1],
  "1" = pop_edad_general$Total_0[2],
  "2" = pop_edad_general$Total_1[2],
  "3" = pop_edad_general$Total_2[2],
  "4" = pop_edad_general$Total_3[2],
  "5" = pop_edad_general$Total_4[2],
  "6" = pop_edad_general$Total_5[2]
))
pop_edad_general
##       Poblacion
## Total  50407647
## 1        759789
## 2       3094088
## 3       7869045
## 4      23454957
## 5      10534315
## 6       4695453
A <- cbind(A, pop_edad_general)
A <- as.data.frame(cbind("Defunciones"=A$CantidadMuertes,"Poblacion Estandar"=A$Poblacion))
A$Defunciones <- as.numeric(A$Defunciones)
A$`Poblacion Estandar` <- as.numeric(A$`Poblacion Estandar`)
A
##   Defunciones Poblacion Estandar
## 1       46019           50407647
## 2          60             759789
## 3          30            3094088
## 4          36            7869045
## 5        2670           23454957
## 6       12176           10534315
## 7       31047            4695453
X <- sqldf("SELECT GRU_ED2, SUM(MES) AS sum
                   FROM covid19identificado 
                   GROUP BY GRU_ED2")
X
##   GRU_ED2    sum
## 1       1    535
## 2       2    251
## 3       3    293
## 4       4  22875
## 5       5 107278
## 6       6 280216
tot2 <- sum(X$sum)
tot2
## [1] 411448
X <- rbind(data.frame(GRU_ED2 = "Total", `sum` = tot2),X)
X
##   GRU_ED2    sum
## 1   Total 411448
## 2       1    535
## 3       2    251
## 4       3    293
## 5       4  22875
## 6       5 107278
## 7       6 280216
# Se toma como la poblacion de riesgo la poblacion que hay en la base de datos nofetal2020
A <- as.data.frame(cbind(A,X))
A
##   Defunciones Poblacion Estandar GRU_ED2    sum
## 1       46019           50407647   Total 411448
## 2          60             759789       1    535
## 3          30            3094088       2    251
## 4          36            7869045       3    293
## 5        2670           23454957       4  22875
## 6       12176           10534315       5 107278
## 7       31047            4695453       6 280216
A$`Poblacion En Riesgo` <- A$sum
A$sum <-NULL
A
##   Defunciones Poblacion Estandar GRU_ED2 Poblacion En Riesgo
## 1       46019           50407647   Total              411448
## 2          60             759789       1                 535
## 3          30            3094088       2                 251
## 4          36            7869045       3                 293
## 5        2670           23454957       4               22875
## 6       12176           10534315       5              107278
## 7       31047            4695453       6              280216
W <- A
# Obtener el nombre de la columna en la posición 1
`Poblacion En Riesgo` <- names(A)[4]

# Crear un nuevo dataframe con el orden de columnas modificado
W <- W[, c(3, 1, 4,2)]

# Cambiar el nombre de la columna movida
names(W)[3] <-`Poblacion En Riesgo`
W
##   GRU_ED2 Defunciones Poblacion En Riesgo Poblacion Estandar
## 1   Total       46019              411448           50407647
## 2       1          60                 535             759789
## 3       2          30                 251            3094088
## 4       3          36                 293            7869045
## 5       4        2670               22875           23454957
## 6       5       12176              107278           10534315
## 7       6       31047              280216            4695453
Tasa <- W$Defunciones/W$`Poblacion En Riesgo`*100000 # Por cada 100000 habitantes
Tasa
## [1] 11184.65 11214.95 11952.19 12286.69 11672.13 11349.95 11079.67
W <- as.data.frame(cbind(W, "Tasa por 100000"=Tasa))
W
##   GRU_ED2 Defunciones Poblacion En Riesgo Poblacion Estandar Tasa por 100000
## 1   Total       46019              411448           50407647        11184.65
## 2       1          60                 535             759789        11214.95
## 3       2          30                 251            3094088        11952.19
## 4       3          36                 293            7869045        12286.69
## 5       4        2670               22875           23454957        11672.13
## 6       5       12176              107278           10534315        11349.95
## 7       6       31047              280216            4695453        11079.67
# Obtener el nombre de la columna en la posición 1
`Tasa por 100000` <- names(W)[5]

# Crear un nuevo dataframe con el orden de columnas modificado
W <- W[, c(1, 2, 3,5,4)]

# Cambiar el nombre de la columna movida
W
##   GRU_ED2 Defunciones Poblacion En Riesgo Tasa por 100000 Poblacion Estandar
## 1   Total       46019              411448        11184.65           50407647
## 2       1          60                 535        11214.95             759789
## 3       2          30                 251        11952.19            3094088
## 4       3          36                 293        12286.69            7869045
## 5       4        2670               22875        11672.13           23454957
## 6       5       12176              107278        11349.95           10534315
## 7       6       31047              280216        11079.67            4695453
defE <- W$`Poblacion Estandar`/100000*W$`Tasa por 100000`

W <- as.data.frame(cbind(W, "Defunciones Esperadas"=defE))
W
##   GRU_ED2 Defunciones Poblacion En Riesgo Tasa por 100000 Poblacion Estandar
## 1   Total       46019              411448        11184.65           50407647
## 2       1          60                 535        11214.95             759789
## 3       2          30                 251        11952.19            3094088
## 4       3          36                 293        12286.69            7869045
## 5       4        2670               22875        11672.13           23454957
## 6       5       12176              107278        11349.95           10534315
## 7       6       31047              280216        11079.67            4695453
##   Defunciones Esperadas
## 1            5637916.60
## 2              85209.98
## 3             369811.31
## 4             966845.12
## 5            2737693.34
## 6            1195639.55
## 7             520240.56
Z<-W
Z$`Defunciones Esperadas`[1]<-sum(W$`Defunciones Esperadas`)-W$`Defunciones Esperadas`[1]
Z
##   GRU_ED2 Defunciones Poblacion En Riesgo Tasa por 100000 Poblacion Estandar
## 1   Total       46019              411448        11184.65           50407647
## 2       1          60                 535        11214.95             759789
## 3       2          30                 251        11952.19            3094088
## 4       3          36                 293        12286.69            7869045
## 5       4        2670               22875        11672.13           23454957
## 6       5       12176              107278        11349.95           10534315
## 7       6       31047              280216        11079.67            4695453
##   Defunciones Esperadas
## 1            5875439.87
## 2              85209.98
## 3             369811.31
## 4             966845.12
## 5            2737693.34
## 6            1195639.55
## 7             520240.56
tasE <- Z$`Defunciones Esperadas`/Z$`Poblacion Estandar`*100000

Z <- as.data.frame(cbind(Z, "Tasas Estandarizadas"=tasE))

Z[1,] ########################## Solucion
##   GRU_ED2 Defunciones Poblacion En Riesgo Tasa por 100000 Poblacion Estandar
## 1   Total       46019              411448        11184.65           50407647
##   Defunciones Esperadas Tasas Estandarizadas
## 1               5875440             11655.85
table(Z)
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 85209.9813084112, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 369811.314741036, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     1     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 520240.561891541, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 966845.119453925, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 50407647, Defunciones Esperadas = 1195639.54809001, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 759789, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 3094088, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 4695453, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 7869045, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 10534315, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11952.1912350598, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 12286.6894197952, Poblacion Estandar = 23454957, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11079.6671139407, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11184.6454472983, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11214.953271028, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 107278, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 280216, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 411448, Tasa por 100000 = 11349.9505956487, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 251, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 293, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 535, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
##   6      0  0  0    0     0     0     0
##   Total  0  0  0    0     0     0     0
## 
## , , Poblacion En Riesgo = 22875, Tasa por 100000 = 11672.131147541, Poblacion Estandar = 50407647, Defunciones Esperadas = 2737693.34163934, Tasas Estandarizadas = 11079.6671139407
## 
##        Defunciones
## GRU_ED2 30 36 60 2670 12176 31047 46019
##   1      0  0  0    0     0     0     0
##   2      0  0  0    0     0     0     0
##   3      0  0  0    0     0     0     0
##   4      0  0  0    0     0     0     0
##   5      0  0  0    0     0     0     0
## 
##  [ reached getOption("max.print") -- omitted 2 row(s) and 14766 matrix slice(s) ]
xtable(Z)
## % latex table generated in R 4.2.2 by xtable 1.8-4 package
## % Mon Sep 25 22:09:35 2023
## \begin{table}[ht]
## \centering
## \begin{tabular}{rlrrrrrr}
##   \hline
##  & GRU\_ED2 & Defunciones & Poblacion En Riesgo & Tasa por 100000 & Poblacion Estandar & Defunciones Esperadas & Tasas Estandarizadas \\ 
##   \hline
## 1 & Total & 46019.00 & 411448.00 & 11184.65 & 50407647.00 & 5875439.87 & 11655.85 \\ 
##   2 & 1 & 60.00 & 535.00 & 11214.95 & 759789.00 & 85209.98 & 11214.95 \\ 
##   3 & 2 & 30.00 & 251.00 & 11952.19 & 3094088.00 & 369811.31 & 11952.19 \\ 
##   4 & 3 & 36.00 & 293.00 & 12286.69 & 7869045.00 & 966845.12 & 12286.69 \\ 
##   5 & 4 & 2670.00 & 22875.00 & 11672.13 & 23454957.00 & 2737693.34 & 11672.13 \\ 
##   6 & 5 & 12176.00 & 107278.00 & 11349.95 & 10534315.00 & 1195639.55 & 11349.95 \\ 
##   7 & 6 & 31047.00 & 280216.00 & 11079.67 & 4695453.00 & 520240.56 & 11079.67 \\ 
##    \hline
## \end{tabular}
## \end{table}