1 Pendahuluan

Pada umumnya, struktur dalam sebuah keluarga hanya memiliki tiga posisi sosial, yaitu: suami-ayah, istri-ibu, dan anak-sibling. Hal ini menjadikan keluarga sebagai orientasi bagi anak, yaitu keluarga tempat ia dilahirkan. Adapun orang tua menjadikan keluarga sebagai wahana prokreasi, yang terbentuk setelah sepasang laki-laki dan perempuan menikah dan memiliki anak (Berns, 2004). Hubungan antara suami istri bersifat saling membutuhkan dan mendukung layaknya persahabatan, sedangkan anak-anak tergantung pada orang tuanya dalam hal pemenuhan kebutuhan afeksi dan sosialisasi (Lestari, 2012). Dari segi pemegang wewenang utama atas keluarga, misalnya dalam penentuan penanggung jawab atas sosialisasi anak, pendistribusian wewenang, dan pemanfaatan sumber daya keluarga, keluarga dibedakan menjadi matriarki, patriarki dan egaliter (Berns, 2004).

Dalam Susenas, struktur keluarga dapat dianalisis untuk kebutuhan yang lebih mendalam seperti pengasuhan anak, kesetaraan gender, dan lainnya, juga dapat diperoleh. Penentuan komposisi keluarga dalam Susenas diambil pada pertanyaan P403: Hubungan dengan Kepala Rumah Tangga (KRT).

rm(list = ls())
library(haven)  # To read SPSS files
library(dplyr)  # For data manipulation

2 Data

Data yang digunakan adalah data Provinsi Riau.

Select specific columns

data <- kor24gab %>%
  select(URUT, PSU, SSU, WI1, WI2, R403, R404, R405, R406A, R406B, R406C, R407, R408, FWT)
data <- data %>% mutate(weight = FWT)
# Generate total counts for different head types by 'URUT'
data <- data %>%
  group_by(URUT) %>%
  summarise(
    hhead = sum(R403 == 1, na.rm = TRUE),
    hhead_sp = sum(R403 == 2, na.rm = TRUE),
    hhead_ch1 = sum(R403 == 3, na.rm = TRUE),
    hhead_ch2 = sum(R403 == 4, na.rm = TRUE),
    hhead_ch3 = sum(R403 == 5, na.rm = TRUE),
    hhead_ch4 = sum(R403 == 6, na.rm = TRUE),
    hhead_pt = sum(R403 == 7, na.rm = TRUE),
    hhead_sr = sum(R403 == 8, na.rm = TRUE),
    hhead_ot = sum(R403 == 9, na.rm = TRUE),
    married_ch1 = sum((R403 == 3) & (R408 == 1), na.rm = TRUE),
    married_ch2 = sum((R403 == 4) & (R408 == 1), na.rm = TRUE),
    married_ch3 = sum((R403 == 5) & (R408 == 1), na.rm = TRUE),
    married_ch4 = sum((R403 == 6) & (R408 == 1), na.rm = TRUE)
  )

3 Keluarga

3.1 Recode Keluarga V1

Dibuat menjadi 9 kategori

  data <- data %>%
  mutate(
    hhtype = as.numeric(as.character(hhtype)),  # Pastikan hhtype berupa numeric
    hhtype2 = case_when(
      hhtype %in% c(9, 15, 17, 19, 21, 23, 25, 27, 29) ~ 7,
      hhtype %in% c(10, 16, 18, 20, 22, 24, 26, 28, 30) ~ 8,
      hhtype %in% 11:14 | is.na(hhtype) ~ 9,
      TRUE ~ hhtype  # Pastikan hhtype tetap numerik
    )
  )

3.2 Recode Keluarga V2

Dibuat menjadi 7 kategori

  data <- data %>%
  mutate(hhtype3 = case_when(
    hhtype2 == 1 ~ 1,
    hhtype2 == 2 ~ 2,
    hhtype2 == 5 ~ 3,
    hhtype2 == 6 ~ 4,
    hhtype2 == 7 ~ 5,
    hhtype2 == 8 ~ 6,
    hhtype2 %in% c(3, 4, 9) ~ 7,
    TRUE ~ as.numeric(hhtype2)  # Pastikan nilai lain tetap ada
    )
  )

4 Distribusi Keluarga

distribution_summary$hhtype2_count[[1]] ## Recode Keluarga V1
## hhtype2
##    1    2    3    4    5    6    7    8    9 
## 6213 1187  224   50   54   27  261  161  157
distribution_summary$hhtype3_count[[1]] ## Recode Keluarga V2
## hhtype3
##    1    2    3    4    5    6    7 
## 6213 1187   54   27  261  161  431

5 Visualisasi

library(ggplot2)
plot_hhtype2 <- ggplot(data, aes(x = as.factor(hhtype2))) +
  geom_bar(fill = "darkorange") +
  labs(title = "Distribusi Recoding Keluarga V1", x = "Tipe Keluarga 2", y = "Jumlah") +
  theme_minimal()

plot_hhtype3 <- ggplot(data, aes(x = as.factor(hhtype3))) +
  geom_bar(fill = "forestgreen") +
  labs(title = "Distribusi Recoding Keluarga V2", x = "Tipe Keluarga 3", y = "Jumlah") +
  theme_minimal()

Menampilkan plot:

print(plot_hhtype2)

print(plot_hhtype3)  

Labelling

Labelling Recoding Keluarga V1: sebanyak 9 kategori

data$hhtype2 <- factor(data$hhtype2, 
                       levels = 1:9, 
                       labels = c(
                          "Two parents nuclear family",
                          "Single parent nuclear family",
                          "Two parents augmented family with parents of HH head",
                          "Single parent augmented family with parents of HH head",
                          "Two parents extended family",
                          "Single parent extended family",
                          "Two parents multigenerational household",
                          "Single parent multigenerational household",
                          "Other household types"
                        )
  )

Labelling Recoding Keluarga V2: sebanyak 7 kategori

data$hhtype3 <- factor(data$hhtype3, 
                       levels = 1:7, 
                       labels = c(
                          "nuclear family with complete parents",
                          "nuclear family with single parents",
                          "extended family with complete parents",
                          "extended family with single parents",
                          "composite family with complete parents",
                          "composite family with single parents",
                          "other household types"
                        )
)

6 References

Berns, R.M. (2004). Child, Family, School, Community: Sosializations and Support. 5th ed. Forth Worth: Hartcourt Brace College Publishers.

Lestari, S. (2021). Psikologi keluarga penanaman nilai dan penanganan konflik dalam keluarga. Jakarta: Kharisma Putra Utama.


Direktorat Statistik Kesejahteraan Rakyat, BPS,