Split Blok RAKL

Uiwang Nur Thoriq

2025-09-07

Akses Data di sini:
https://docs.google.com/spreadsheets/d/1Vy3fnvyHrovL_0IK2r17H9hOX232P7a2G8GA-0-3iA0/edit?usp=sharing

Rancangan split blok atau strip plot RAKL hampir mirip dengan rancangan split plot. Pada rancangan split blok, percobaan mengutamakan pada ketepatan pengaruh interaksi antara faktor yang dicobakan dibandingkan dengan pengaruh utama kedua faktor. Rancangan ini juga tersusun atas petak utama dan anak petak. Split blok hanya dapat diaplikasikan pada RAKL.

Pengacakan dan Layout Percobaan

Penempatan taraf faktor yang dicobakan dilakukan saling bersilangan, dengan langkah pengacakan:
1. Memilih blok atau kelompok pada percobaan secara acak.
2. Menempatkan taraf faktor pertama secara acak pada setiap blok mengikuti plot lajur atau kolom.
3. Menempatkan taraf faktor kedua secara acak pada setiap blok mengikuti plot baris.

Contoh Kasus

Diketahui suatu percobaan dilakukan untuk mengetahui adanya pengaruh kombinasi pemupukan NPK dan genotip padi terhadap hasil padi (kg/petak). Pengaruh kombinasi pemupukan NPK(A) terdiri dari 6 taraf ditempatkan sebagai faktor A (Vertikal) dan genotip padi terdiri dari 2 taraf yang ditempatkan sebagai faktor B (Horizontal). Rancangan Dasar yang digunakan adalah RAK. Percobaan diulang 4 kali.

Cara 1

Pupuk<-c("Kontrol", "PK", "N", "NP", "NK","NPK")
Genotipe<-c("IR-64","S-969")

library(agricolae)
LayoutSB<-design.strip(Pupuk,Genotipe,r=4,serie=1,seed=020)
LayoutSB$book
##    plots block   Pupuk Genotipe
## 1     11     1     NPK    S-969
## 2     12     1     NPK    IR-64
## 3     13     1      NK    S-969
## 4     14     1      NK    IR-64
## 5     15     1 Kontrol    S-969
## 6     16     1 Kontrol    IR-64
## 7     17     1       N    S-969
## 8     18     1       N    IR-64
## 9     19     1      PK    S-969
## 10    20     1      PK    IR-64
## 11    21     1      NP    S-969
## 12    22     1      NP    IR-64
## 13    21     2     NPK    S-969
## 14    22     2     NPK    IR-64
## 15    23     2 Kontrol    S-969
## 16    24     2 Kontrol    IR-64
## 17    25     2      NP    S-969
## 18    26     2      NP    IR-64
## 19    27     2      PK    S-969
## 20    28     2      PK    IR-64
## 21    29     2       N    S-969
## 22    30     2       N    IR-64
## 23    31     2      NK    S-969
## 24    32     2      NK    IR-64
## 25    31     3       N    IR-64
## 26    32     3       N    S-969
## 27    33     3      PK    IR-64
## 28    34     3      PK    S-969
## 29    35     3      NP    IR-64
## 30    36     3      NP    S-969
## 31    37     3     NPK    IR-64
## 32    38     3     NPK    S-969
## 33    39     3      NK    IR-64
## 34    40     3      NK    S-969
## 35    41     3 Kontrol    IR-64
## 36    42     3 Kontrol    S-969
## 37    41     4      NK    S-969
## 38    42     4      NK    IR-64
## 39    43     4       N    S-969
## 40    44     4       N    IR-64
## 41    45     4      PK    S-969
## 42    46     4      PK    IR-64
## 43    47     4 Kontrol    S-969
## 44    48     4 Kontrol    IR-64
## 45    49     4     NPK    S-969
## 46    50     4     NPK    IR-64
## 47    51     4      NP    S-969
## 48    52     4      NP    IR-64

Cara 2

library(edibble)

DesignSB<-design(name="Bagan Split Blok") %>%
  set_units(Blok=4,
            Baris=nested_in(Blok,2),
            Kolom=nested_in(Blok,6),
            Petak=nested_in(Blok,crossed_by(Baris,Kolom))) %>%
  set_trts(genotipe=Genotipe,
           pupuk=Pupuk) %>%
  allot_trts(genotipe~Baris,
             pupuk~Kolom) %>%
  assign_trts("random", seed=020) %>% serve_table

DesignSB
## # An edibble: 48 x 6
##      Blok  Baris   Kolom   Petak genotipe  pupuk
##    <U(4)> <U(8)> <U(24)> <U(48)>   <T(2)> <T(6)>
##     <chr>  <chr>   <chr>   <chr>    <chr>  <chr>
##  1  Blok1 Baris1 Kolom01 Petak01    IR-64    NPK
##  2  Blok1 Baris2 Kolom01 Petak02    S-969    NPK
##  3  Blok1 Baris1 Kolom02 Petak03    IR-64    N  
##  4  Blok1 Baris2 Kolom02 Petak04    S-969    N  
##  5  Blok1 Baris1 Kolom03 Petak05    IR-64    NK 
##  6  Blok1 Baris2 Kolom03 Petak06    S-969    NK 
##  7  Blok1 Baris1 Kolom04 Petak07    IR-64    NP 
##  8  Blok1 Baris2 Kolom04 Petak08    S-969    NP 
##  9  Blok1 Baris1 Kolom05 Petak09    IR-64    PK 
## 10  Blok1 Baris2 Kolom05 Petak10    S-969    PK 
## # ℹ 38 more rows
library(deggust)
autoplot(DesignSB)

Model Linear

\[ Y_{ijk}=\mu+\alpha_i+K_k+\delta_{ik}+\beta_j+\gamma_{jk}+(\alpha\beta)_{ij}+ε_{ijk} \]

Keterangan:
\(Y_{ijk}\) = nilai pengamatan pada faktor A taraf ke-i, faktor B taraf ke-j, dan kelompok ke-k.
\(\mu\) = komponen aditif dari rataan umum.
\(\alpha_i\) = pengaruh utama faktor A.
\(K_k\) = pengaruh utama kelompok.
\(\beta_j\) = pengaruh utama faktor B.
\((\alpha\beta)_{ij}\) = komponen interaksi dari faktor A dan faktor B.
\(\gamma_{jk}\) = komponen acak dari faktor B ke-j kelompok ke-k yang menyebar Normal.
\(\delta_{ik}\) = komponen acak dari faktor A ke-i kelompok ke-k yang menyebar Normal.
\(ε_{ijk}\) = pengaruh acak satuan percobaan ke-k yang memperoleh interaksi faktor A ke-i dan faktor B ke-j yang menyebar Normal.

Hipotesis

Pengaruh utama faktor A:

\(H_0\) : \(\alpha_1=\alpha_2=...=\alpha_a=0\) (Faktor A tidak berpengaruh terhadap respon).

\(H_1\) : Minimal ada satu i dimana \(\alpha_i≠0\).

Pengaruh utama faktor B:

\(H_0\) : \(\beta_1=\beta_2=...=\beta_b=0\) (faktor B tidak berpengaruh terhadap respon).

\(H_1\) : Minimal ada satu j dimana \(\beta_j≠0\).

Pengaruh interaksi faktor A dengan faktor B:

\(H_0\) : \((\alpha\beta)_{11}=(\alpha\beta)_{12}=...=(\alpha\beta)_{ab}=0\) (Interaksi dari faktor A dengan faktor B tidak berpengaruh terhadap respon).

\(H_1\) : Minimal ada sepasang (i,j) dimana \((\alpha\beta)_{ij}≠0\).

Pengaruh kelompok:

\(H_0\) : \(K_1=K_2=...=K_k=0\) (Kelompok tidak berpengaruh terhadap respon).

\(H_1\) : Minimal ada satu k dimana \(K_k≠0\).

Import Data

library(readxl)
DataSB<-read_xlsx("D:/Rancob/DataFull.xlsx",sheet="SplitBlok-RAKL")
DataSB
## # A tibble: 48 × 4
##    Pupuk   Genotipe Blok  Hasil
##    <chr>   <chr>    <chr> <dbl>
##  1 Kontrol IR-64    B1     20.7
##  2 Kontrol S-969    B1     27.7
##  3 PK      IR-64    B1     30  
##  4 PK      S-969    B1     36.6
##  5 N       IR-64    B1     39.9
##  6 N       S-969    B1     37.4
##  7 NP      IR-64    B1     40.8
##  8 NP      S-969    B1     42.2
##  9 NK      IR-64    B1     42.4
## 10 NK      S-969    B1     39.8
## # ℹ 38 more rows

ANOVA

DataSB$Pupuk<-as.factor(DataSB$Pupuk)
DataSB$Genotipe<-as.factor(DataSB$Genotipe)
DataSB$Blok<-as.factor(DataSB$Blok)
ANOVASB<-aov(Hasil~Pupuk*Genotipe+Blok+Error(Blok:(Pupuk*Genotipe)),data=DataSB)
summary(ANOVASB)
## 
## Error: Blok:Pupuk
##           Df Sum Sq Mean Sq F value   Pr(>F)    
## Pupuk      5 1674.8   335.0  18.767 5.62e-06 ***
## Blok       3  197.1    65.7   3.681   0.0362 *  
## Residuals 15  267.7    17.8                     
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Error: Blok:Genotipe
##           Df Sum Sq Mean Sq F value Pr(>F)
## Genotipe   1  0.035  0.0352   0.032   0.87
## Residuals  3  3.329  1.1097               
## 
## Error: Blok:Pupuk:Genotipe
##                Df Sum Sq Mean Sq F value Pr(>F)  
## Pupuk:Genotipe  5  78.59   15.72   4.504 0.0105 *
## Residuals      15  52.35    3.49                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
qf(0.05,5,15,lower.tail = FALSE)
## [1] 2.901295
qf(0.05,3,15,lower.tail = FALSE)
## [1] 3.287382
qf(0.05,1,3,lower.tail = FALSE)
## [1] 10.12796

Pengaruh faktor A (Pupuk) Fhit = 18.767 > Ftabel(0.05,5,15) = 2.901 , maka tolak H0, artinya cukup bukti untuk menyatakan bahwa pupuk berpengaruh terhadap hasil padi(kg/petak) pada taraf nyata 5%.

Pengaruh faktor B (Genotipe Padi) Fhit = 0.032 < Ftabel(0.05,1,3) = 10.128, maka tak tolak H0, artinya tidak cukup bukti untuk menyatakan bahwa genotip padi berpengaruh terhadap hasil padi(kg/petak) pada taraf nyata 5%.

Pengaruh Interaksi pupuk dan genotip padi Fhit = 4.504 > Ftabel(0.05,5,15) = 2.901, maka tolak H0, artinya cukup bukti untuk menyatakan bahwa interaksi antara pupuk dan genotip padi berpengaruh terhadap hasil padi(kg/petak) pada taraf nyata 5%.

Pengaruh pengelompokan (Blok) Fhit = 3.681 > Ftabel(0.05,3,15) = 3.287, maka Tolak H0, artinya cukup bukti untuk menyatakan bahwa pengelompokan berpengaruh terhadap hasil padi(kg/petak) pada taraf nyata 5%.