1 Giriş

Bu bölmədə Kompüter Adaptiv Testləşmə (CAT) sisteminin tam simulyasiya funksiyasını yaradacağıq. Bu funksiya əvvəlki bölmələrdə öyrəndiyimiz bütün komponentləri birləşdirərək tam funksional CAT sessiyası simulyasiya edir.

CAT simulyasiyası müxtəlif komponentlərin harmonik birləşməsindən ibarətdir: item seçimi, cavab generasiyası, qabiliyyət qiymətləndirməsi və sonlandırma kriteriyaları. Bu bölmədə həm fərdi həm də kütləvi simulyasiyalar üçün ətraflı həllər təqdim edəcəyik.

1.1 CAT Simulyasiyasının Əhəmiyyəti

Tam CAT simulyasiyası tədqiqatçılara və test tərtibçilərinə aşağıdakı imkanları verir:

  1. Sistem Performansının Qiymətləndirilməsi: Real şəraitdə CAT alqoritmlərinin necə işləyəcəyini anlamaq
  2. Strategiya Müqayisəsi: Müxtəlif item seçimi və sonlandırma strategiyalarının effektivliyini müqayisə etmək
  3. Parametr Optimizasiyası: Optimal test parametrlərini müəyyən etmək
  4. Keyfiyyət Nəzarəti: Test dəqiqliyi və effektivliyini ölçmək

1.2 Simulyasiya Komponentləri

CAT simulyasiyası aşağıdakı əsas komponentlərdən ibarətdir:

  • Item Bank: Test tapşırıqlarının məcmusu
  • Item Selection Algorithm: Növbəti tapşırığın seçilməsi meyarı
  • Response Generation: Test alıcısı cavablarının simulyasiyası
  • Ability Estimation: Qabiliyyət səviyyəsinin qiymətləndirilməsi
  • Termination Criteria: Testin sonlandırılması kriteriyaları

2 Köməkçi Funksiyalar

Tam CAT simulyasiyası üçün əvvəl bir neçə köməkçi funksiya lazımdır:

2.1 Item Seçimi Funksiyası

# Item seçimi funksiyası - Maximum Fisher Information meyarı
select_next_item <- function(current_theta, item_bank, administered_items = c()) {
    
    cat("=== ITEM SEÇİMİ ALGORİTMİ ===\n")
    cat("Current theta:", round(current_theta, 3), "\n")
    cat("Administered items sayı:", length(administered_items), "\n")
    
    # Mövcud items
    available_items <- setdiff(1:nrow(item_bank), administered_items)
    
    if (length(available_items) == 0) {
        cat("XƏBƏRDARLIQ: Heç bir item qalmayıb!\n")
        return(NULL)
    }
    
    cat("Available items sayı:", length(available_items), "\n")
    
    # Hər available item üçün Fisher Information hesabla
    information_values <- numeric(length(available_items))
    
    for (i in 1:length(available_items)) {
        item_idx <- available_items[i]
        
        a <- item_bank$a[item_idx]
        b <- item_bank$b[item_idx]
        c <- item_bank$c[item_idx]
        
        # 3PL model üçün Fisher Information
        P <- c + (1 - c) * plogis(a * (current_theta - b))
        Q <- 1 - P
        P_prime <- a * (1 - c) * exp(-a * (current_theta - b)) / 
                   (1 + exp(-a * (current_theta - b)))^2
        
        # P və Q-nun sıfıra çox yaxın olmasının qarşısını almaq
        P <- pmax(0.0001, pmin(0.9999, P))
        Q <- 1 - P
        
        information_values[i] <- (P_prime^2) / (P * Q)
    }
    
    # Ən yüksək information-a malik itemi seç
    best_item_position <- which.max(information_values)
    selected_item <- available_items[best_item_position]
    
    cat("Seçilmiş item:", selected_item, "\n")
    cat("Fisher Information:", round(information_values[best_item_position], 3), "\n")
    cat("Item parametrləri: a =", round(item_bank$a[selected_item], 2),
        ", b =", round(item_bank$b[selected_item], 2),
        ", c =", round(item_bank$c[selected_item], 2), "\n\n")
    
    return(list(
        item_index = selected_item,
        information = information_values[best_item_position],
        available_count = length(available_items)
    ))
}

# Test item bank yaradaq
set.seed(123)
test_item_bank <- data.frame(
    a = runif(20, 0.8, 2.5),
    b = rnorm(20, 0, 1.2),
    c = runif(20, 0.1, 0.25)
)

cat("=== ITEM SEÇİMİ TESTİ ===\n")
## === ITEM SEÇİMİ TESTİ ===
# Müxtəlif theta dəyərləri üçün item seçimi
test_thetas <- c(-1, 0, 1)
for(theta in test_thetas) {
    cat("Theta =", theta, " üçün:\n")
    selection <- select_next_item(theta, test_item_bank, c())
    cat("---\n")
}
## Theta = -1  üçün:
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1 
## Administered items sayı: 0 
## Available items sayı: 20 
## Seçilmiş item: 11 
## Fisher Information: 0.933 
## Item parametrləri: a = 2.43 , b = -1.28 , c = 0.21 
## 
## ---
## Theta = 0  üçün:
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 0 
## Available items sayı: 20 
## Seçilmiş item: 4 
## Fisher Information: 0.932 
## Item parametrləri: a = 2.3 , b = 0.13 , c = 0.14 
## 
## ---
## Theta = 1  üçün:
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1 
## Administered items sayı: 0 
## Available items sayı: 20 
## Seçilmiş item: 2 
## Fisher Information: 0.692 
## Item parametrləri: a = 2.14 , b = 0.43 , c = 0.11 
## 
## ---

2.2 Qabiliyyət Qiymətləndirmə Funksiyası (EAP)

# Expected A Posteriori (EAP) qiymətləndirmə
estimate_ability_eap <- function(administered_items, responses, item_bank,
                                prior_mean = 0, prior_sd = 1, 
                                theta_range = seq(-4, 4, 0.1)) {
    
    cat("=== QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===\n")
    cat("Administered items:", length(administered_items), "\n")
    cat("Responses:", paste(responses, collapse = ", "), "\n")
    
    if (length(administered_items) == 0 || length(responses) == 0) {
        cat("Boş data - prior qaytarılır\n")
        return(list(theta = prior_mean, se = prior_sd))
    }
    
    # Theta grid üzərində hesablama
    likelihood <- numeric(length(theta_range))
    
    for (j in 1:length(theta_range)) {
        theta <- theta_range[j]
        log_likelihood <- 0
        
        for (i in 1:length(administered_items)) {
            item_idx <- administered_items[i]
            response <- responses[i]
            
            a <- item_bank$a[item_idx]
            b <- item_bank$b[item_idx]
            c <- item_bank$c[item_idx]
            
            # 3PL model ehtimalı
            P <- c + (1 - c) * plogis(a * (theta - b))
            P <- pmax(0.0001, pmin(0.9999, P))  # Numerical stability
            
            if (response == 1) {
                log_likelihood <- log_likelihood + log(P)
            } else {
                log_likelihood <- log_likelihood + log(1 - P)
            }
        }
        
        likelihood[j] <- exp(log_likelihood)
    }
    
    # Prior distribution (normal)
    prior <- dnorm(theta_range, prior_mean, prior_sd)
    
    # Posterior distribution
    posterior <- likelihood * prior
    
    # Normalization
    if (sum(posterior) > 0) {
        posterior <- posterior / sum(posterior)
    } else {
        # Əgər posterior sıfırdırsa, priora qayıt
        posterior <- prior / sum(prior)
        cat("XƏBƏRDARLIQ: Posterior sıfır, priora qayıdıldı\n")
    }
    
    # EAP estimate
    theta_eap <- sum(theta_range * posterior)
    
    # Posterior variance və standard error
    variance_post <- sum((theta_range - theta_eap)^2 * posterior)
    se_eap <- sqrt(variance_post)
    
    cat("EAP theta:", round(theta_eap, 3), "\n")
    cat("Posterior SE:", round(se_eap, 3), "\n\n")
    
    return(list(
        theta = theta_eap,
        se = se_eap,
        posterior = posterior,
        theta_range = theta_range
    ))
}

# EAP funksiya testi
cat("=== EAP FUNKSİYA TESTİ ===\n")
## === EAP FUNKSİYA TESTİ ===
sample_items <- c(1, 5, 10)
sample_responses <- c(1, 0, 1)

eap_result <- estimate_ability_eap(sample_items, sample_responses, test_item_bank)
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 1 
## EAP theta: -0.555 
## Posterior SE: 0.722

2.3 Sonlandırma Kriteriyaları Funksiyası

# Sonlandırma kriteriyalarını yoxlama
check_termination <- function(current_step, theta_se, min_items = 5, max_items = 30, se_threshold = 0.3) {
    
    cat("=== SONLANDIRMA KRİTERİYALARI YOXLAMASI ===\n")
    cat("Current step:", current_step, "\n")
    cat("Current SE:", round(theta_se, 3), "\n")
    cat("Min items:", min_items, ", Max items:", max_items, ", SE threshold:", se_threshold, "\n")
    
    # Minimum item sayına çatmayıbsa
    if (current_step < min_items) {
        reason <- paste("Minimum item sayına çatılmayıb:", current_step, "/", min_items)
        cat("Qərar: DAVAM (", reason, ")\n\n")
        return(list(terminate = FALSE, reason = reason))
    }
    
    # Maksimum item sayına çatıbsa
    if (current_step >= max_items) {
        reason <- paste("Maksimum item sayına çatıldı:", current_step, "/", max_items)
        cat("Qərar: SONLANDIR (", reason, ")\n\n")
        return(list(terminate = TRUE, reason = reason))
    }
    
    # SE threshold-a çatıbsa
    if (!is.na(theta_se) && theta_se <= se_threshold) {
        reason <- paste("Tələb olunan dəqiqliyə çatıldı: SE =", round(theta_se, 3), "≤", se_threshold)
        cat("Qərar: SONLANDIR (", reason, ")\n\n")
        return(list(terminate = TRUE, reason = reason))
    }
    
    # Davam etməli
    reason <- paste("Davam edir: SE =", round(theta_se, 3), "> threshold =", se_threshold)
    cat("Qərar: DAVAM (", reason, ")\n\n")
    return(list(terminate = FALSE, reason = reason))
}

# Sonlandırma funksiya testi  
cat("=== SONLANDIRMA FUNKSİYA TESTİ ===\n")
## === SONLANDIRMA FUNKSİYA TESTİ ===
test_scenarios <- list(
    list(step = 3, se = 0.4, desc = "Az item, yüksək SE"),
    list(step = 8, se = 0.25, desc = "Kifayət item, aşağı SE"),
    list(step = 30, se = 0.5, desc = "Max item, yüksək SE")
)

for(i in 1:length(test_scenarios)) {
    scenario <- test_scenarios[[i]]
    cat("Ssenari", i, ":", scenario$desc, "\n")
    result <- check_termination(scenario$step, scenario$se)
    cat("---\n")
}
## Ssenari 1 : Az item, yüksək SE 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.4 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## ---
## Ssenari 2 : Kifayət item, aşağı SE 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.25 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.25 ≤ 0.3 )
## 
## ---
## Ssenari 3 : Max item, yüksək SE 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.5 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## ---

2.4 Cavab Generasiya Funksiyası

# Əvvəlki bölmədən cavab generasiya funksiyası
generate_response <- function(true_theta, item_params, include_error = TRUE) {
    a <- item_params$a
    b <- item_params$b
    c <- item_params$c
    
    # 3PL modelə əsasən doğru cavab ehtimalı
    prob_correct <- c + (1 - c) * plogis(a * (true_theta - b))
    
    # Əlavə xəta mənbələri
    if (include_error) {
        error_factor <- rnorm(1, 0, 0.05)
        prob_correct <- pmax(0, pmin(1, prob_correct + error_factor))
    }
    
    # Bernoulli sınağı
    response <- rbinom(1, 1, prob_correct)
    
    return(list(
        response = response,
        prob_correct = prob_correct,
        item_difficulty = b,
        discrimination = a
    ))
}

cat("=== CAVAB GENERASİYA FUNKSİYA TESTİ ===\n")
## === CAVAB GENERASİYA FUNKSİYA TESTİ ===
sample_item <- test_item_bank[1, ]
cat("Item parametrləri: a =", round(sample_item$a, 2), 
    ", b =", round(sample_item$b, 2), 
    ", c =", round(sample_item$c, 2), "\n")
## Item parametrləri: a = 1.29 , b = 1.47 , c = 0.2
for(theta in c(-1, 0, 1)) {
    test_response <- generate_response(theta, sample_item)
    cat("Theta =", theta, ": Response =", test_response$response, 
        ", P(correct) =", round(test_response$prob_correct, 3), "\n")
}
## Theta = -1 : Response = 0 , P(correct) = 0.197 
## Theta = 0 : Response = 0 , P(correct) = 0.345 
## Theta = 1 : Response = 0 , P(correct) = 0.591
cat("\n")

3 Ana CAT Simulyasiya Funksiyası

# Tam CAT simulyasiyası
run_cat_simulation <- function(examinee_ability, item_bank, 
                              min_items = 5, max_items = 30, se_threshold = 0.3,
                              verbose = TRUE) {
    
    # Başlanğıc parametrlər
    administered_items <- c()
    responses <- c()
    theta_estimates <- c()
    se_estimates <- c()
    current_theta <- 0  # İlkin qabiliyyət qiymətləndirməsi
    current_se <- 1.0   # İlkin SE
    
    if (verbose) {
        cat("=== CAT SİMULYASİYA BAŞLADI ===\n")
        cat("Həqiqi θ:", examinee_ability, "\n")
        cat("Parametrlər: min_items =", min_items, ", max_items =", max_items, 
            ", SE threshold =", se_threshold, "\n")
        cat("Item bank ölçüsü:", nrow(item_bank), "\n\n")
    }
    
    for (step in 1:max_items) {
        
        if (verbose) cat(">>> ADDIM", step, "<<<\n")
        
        # Tapşırıq seçimi
        if (step == 1) {
            # İlk tapşırıq - orta çətinlik
            if (verbose) cat("İlk item seçimi (orta çətinlik)\n")
            available_items <- 1:nrow(item_bank)
            difficulty_diff <- abs(item_bank$b - 0)
            selected_item <- available_items[which.min(difficulty_diff)]
            
            if (verbose) {
                cat("Seçilmiş item:", selected_item, 
                    "(b =", round(item_bank$b[selected_item], 2), ")\n")
            }
        } else {
            # Sonrakı tapşırıqlar - Maximum Fisher Information
            if (verbose) cat("Fisher Information əsaslı item seçimi\n")
            item_selection <- select_next_item(current_theta, item_bank, administered_items)
            if (is.null(item_selection)) {
                if (verbose) cat("Heç bir item qalmadı - simulyasiya dayandırıldı!\n")
                break
            }
            selected_item <- item_selection$item_index
        }
        
        administered_items <- c(administered_items, selected_item)
        
        # Cavab generasiyası
        response_result <- generate_response(examinee_ability, item_bank[selected_item, ])
        responses <- c(responses, response_result$response)
        
        if (verbose) {
            cat("Response generasiyası:\n")
            cat("  Cavab:", response_result$response, 
                "(P =", round(response_result$prob_correct, 3), ")\n")
        }
        
        # Qabiliyyət qiymətləndirmə (2-ci tapşırıqdan etibarən)
        if (step >= 2) {
            if (verbose) cat("Qabiliyyət qiymətləndirməsi:\n")
            ability_est <- estimate_ability_eap(administered_items, responses, item_bank)
            current_theta <- ability_est$theta
            current_se <- ability_est$se
            
            theta_estimates <- c(theta_estimates, current_theta)
            se_estimates <- c(se_estimates, current_se)
            
            if (verbose) {
                cat("  θ̂ =", round(current_theta, 3), ", SE =", round(current_se, 3), "\n")
                cat("  Mütləq xəta:", round(abs(current_theta - examinee_ability), 3), "\n")
            }
            
            # Sonlandırma kriteriyalarını yoxla
            termination <- check_termination(step, current_se, min_items, max_items, se_threshold)
            
            if (termination$terminate) {
                if (verbose) cat(">>> TEST SONLANDI <<<\n")
                if (verbose) cat("Səbəb:", termination$reason, "\n")
                break
            }
        }
        
        if (verbose) cat("---\n")
    }
    
    # Final qiymətləndirmə
    if (verbose) cat("\nFinal qiymətləndirmə hesablanır...\n")
    final_ability <- estimate_ability_eap(administered_items, responses, item_bank)
    
    return(list(
        administered_items = administered_items,
        responses = responses,
        theta_estimates = theta_estimates,
        se_estimates = se_estimates,
        final_theta = final_ability$theta,
        final_se = final_ability$se,
        items_count = length(administered_items),
        accuracy = mean(responses),
        true_theta = examinee_ability,
        estimation_error = abs(final_ability$theta - examinee_ability)
    ))
}

# İndi item bank və examinees yaradaq
set.seed(456)
item_bank <- data.frame(
    a = runif(50, 0.8, 2.5),
    b = rnorm(50, 0, 1.2),
    c = runif(50, 0.1, 0.25)
)

set.seed(789)
examinees <- data.frame(
    id = 1:3,
    true_theta = c(-1.0, 0.0, 1.5)
)

cat("=== ITEM BANK VƏ EXAMİNEES MƏLUMATLARI ===\n")
## === ITEM BANK VƏ EXAMİNEES MƏLUMATLARI ===
cat("Item sayı:", nrow(item_bank), "\n")
## Item sayı: 50
cat("a parametri aralığı:", round(range(item_bank$a), 2), "\n")
## a parametri aralığı: 0.87 2.48
cat("b parametri aralığı:", round(range(item_bank$b), 2), "\n")
## b parametri aralığı: -2.71 2.49
cat("c parametri aralığı:", round(range(item_bank$c), 2), "\n")
## c parametri aralığı: 0.11 0.25
cat("Test alıcı sayı:", nrow(examinees), "\n")
## Test alıcı sayı: 3
cat("True theta aralığı:", range(examinees$true_theta), "\n\n")
## True theta aralığı: -1 1.5
# Bir test alıcısı üçün ətraflı simulyasiya
cat("=== BİR TEST ALICISININ ƏTRAFLİ SİMULYASİYASI ===\n")
## === BİR TEST ALICISININ ƏTRAFLİ SİMULYASİYASI ===
single_result <- run_cat_simulation(examinees$true_theta[1], item_bank, verbose = TRUE)
## === CAT SİMULYASİYA BAŞLADI ===
## Həqiqi θ: -1 
## Parametrlər: min_items = 5 , max_items = 30 , SE threshold = 0.3 
## Item bank ölçüsü: 50 
## 
## >>> ADDIM 1 <<<
## İlk item seçimi (orta çətinlik)
## Seçilmiş item: 50 (b = -0.02 )
## Response generasiyası:
##   Cavab: 0 (P = 0.284 )
## ---
## >>> ADDIM 2 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 49 
## Seçilmiş item: 27 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.42 , b = -0.31 , c = 0.18 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.324 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.982 
## Posterior SE: 0.667 
## 
##   θ̂ = -0.982 , SE = 0.667 
##   Mütləq xəta: 0.018 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.667 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## ---
## >>> ADDIM 3 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.982 
## Administered items sayı: 2 
## Available items sayı: 48 
## Seçilmiş item: 37 
## Fisher Information: 0.964 
## Item parametrləri: a = 2.48 , b = -1.18 , c = 0.24 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.711 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 1 
## EAP theta: -0.781 
## Posterior SE: 0.591 
## 
##   θ̂ = -0.781 , SE = 0.591 
##   Mütləq xəta: 0.219 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.591 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## ---
## >>> ADDIM 4 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.781 
## Administered items sayı: 3 
## Available items sayı: 47 
## Seçilmiş item: 5 
## Fisher Information: 0.707 
## Item parametrləri: a = 2.14 , b = -1.31 , c = 0.13 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.683 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 1, 1 
## EAP theta: -0.636 
## Posterior SE: 0.52 
## 
##   θ̂ = -0.636 , SE = 0.52 
##   Mütləq xəta: 0.364 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.52 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## ---
## >>> ADDIM 5 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.636 
## Administered items sayı: 4 
## Available items sayı: 46 
## Seçilmiş item: 14 
## Fisher Information: 0.781 
## Item parametrləri: a = 2.2 , b = -0.51 , c = 0.18 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.356 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 1, 1, 0 
## EAP theta: -0.841 
## Posterior SE: 0.484 
## 
##   θ̂ = -0.841 , SE = 0.484 
##   Mütləq xəta: 0.159 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.484 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.484 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 6 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.841 
## Administered items sayı: 5 
## Available items sayı: 45 
## Seçilmiş item: 26 
## Fisher Information: 0.69 
## Item parametrləri: a = 2 , b = -0.8 , c = 0.17 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.401 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 1, 1, 0, 1 
## EAP theta: -0.705 
## Posterior SE: 0.447 
## 
##   θ̂ = -0.705 , SE = 0.447 
##   Mütləq xəta: 0.295 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.447 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.447 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 7 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.705 
## Administered items sayı: 6 
## Available items sayı: 44 
## Seçilmiş item: 3 
## Fisher Information: 0.598 
## Item parametrləri: a = 2.05 , b = -0.39 , c = 0.17 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.392 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -0.829 
## Posterior SE: 0.429 
## 
##   θ̂ = -0.829 , SE = 0.429 
##   Mütləq xəta: 0.171 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.429 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.429 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 8 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.829 
## Administered items sayı: 7 
## Available items sayı: 43 
## Seçilmiş item: 24 
## Fisher Information: 0.412 
## Item parametrləri: a = 1.56 , b = -1.41 , c = 0.13 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.692 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.762 
## Posterior SE: 0.402 
## 
##   θ̂ = -0.762 , SE = 0.402 
##   Mütləq xəta: 0.238 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.402 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.402 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 9 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.762 
## Administered items sayı: 8 
## Available items sayı: 42 
## Seçilmiş item: 38 
## Fisher Information: 0.462 
## Item parametrləri: a = 2.36 , b = -0.24 , c = 0.2 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.306 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.844 
## Posterior SE: 0.386 
## 
##   θ̂ = -0.844 , SE = 0.386 
##   Mütləq xəta: 0.156 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.386 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.386 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 10 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.844 
## Administered items sayı: 9 
## Available items sayı: 41 
## Seçilmiş item: 13 
## Fisher Information: 0.362 
## Item parametrləri: a = 2.08 , b = -0.17 , c = 0.15 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.277 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0 
## EAP theta: -0.903 
## Posterior SE: 0.378 
## 
##   θ̂ = -0.903 , SE = 0.378 
##   Mütləq xəta: 0.097 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.378 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.378 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 11 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.903 
## Administered items sayı: 10 
## Available items sayı: 40 
## Seçilmiş item: 18 
## Fisher Information: 0.296 
## Item parametrləri: a = 1.57 , b = -0.3 , c = 0.16 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.331 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0 
## EAP theta: -0.962 
## Posterior SE: 0.377 
## 
##   θ̂ = -0.962 , SE = 0.377 
##   Mütləq xəta: 0.038 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.377 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.377 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 12 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.962 
## Administered items sayı: 11 
## Available items sayı: 39 
## Seçilmiş item: 48 
## Fisher Information: 0.25 
## Item parametrləri: a = 1.72 , b = -2.06 , c = 0.23 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.893 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1 
## EAP theta: -0.934 
## Posterior SE: 0.363 
## 
##   θ̂ = -0.934 , SE = 0.363 
##   Mütləq xəta: 0.066 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 13 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.934 
## Administered items sayı: 12 
## Available items sayı: 38 
## Seçilmiş item: 16 
## Fisher Information: 0.257 
## Item parametrləri: a = 1.91 , b = -0.03 , c = 0.11 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.244 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0 
## EAP theta: -0.972 
## Posterior SE: 0.359 
## 
##   θ̂ = -0.972 , SE = 0.359 
##   Mütləq xəta: 0.028 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.359 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.359 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 14 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.972 
## Administered items sayı: 13 
## Available items sayı: 37 
## Seçilmiş item: 6 
## Fisher Information: 0.238 
## Item parametrləri: a = 1.36 , b = -0.63 , c = 0.25 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.564 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0 
## EAP theta: -1.036 
## Posterior SE: 0.361 
## 
##   θ̂ = -1.036 , SE = 0.361 
##   Mütləq xəta: 0.036 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.361 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.361 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 15 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.036 
## Administered items sayı: 14 
## Available items sayı: 36 
## Seçilmiş item: 12 
## Fisher Information: 0.212 
## Item parametrləri: a = 1.17 , b = -0.79 , c = 0.2 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.586 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1 
## EAP theta: -0.984 
## Posterior SE: 0.348 
## 
##   θ̂ = -0.984 , SE = 0.348 
##   Mütləq xəta: 0.016 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 16 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.984 
## Administered items sayı: 15 
## Available items sayı: 35 
## Seçilmiş item: 40 
## Fisher Information: 0.22 
## Item parametrləri: a = 1.7 , b = -0.05 , c = 0.13 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.223 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1 
## EAP theta: -0.9 
## Posterior SE: 0.339 
## 
##   θ̂ = -0.9 , SE = 0.339 
##   Mütləq xəta: 0.1 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.339 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.339 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 17 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.9 
## Administered items sayı: 16 
## Available items sayı: 34 
## Seçilmiş item: 32 
## Fisher Information: 0.182 
## Item parametrləri: a = 1.17 , b = -0.5 , c = 0.23 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.433 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0 
## EAP theta: -0.949 
## Posterior SE: 0.341 
## 
##   θ̂ = -0.949 , SE = 0.341 
##   Mütləq xəta: 0.051 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 18 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.949 
## Administered items sayı: 17 
## Available items sayı: 33 
## Seçilmiş item: 44 
## Fisher Information: 0.175 
## Item parametrləri: a = 1.02 , b = -0.65 , c = 0.16 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.417 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1 
## EAP theta: -0.904 
## Posterior SE: 0.331 
## 
##   θ̂ = -0.904 , SE = 0.331 
##   Mütləq xəta: 0.096 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.331 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.331 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 19 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 18 
## Available items sayı: 32 
## Seçilmiş item: 2 
## Fisher Information: 0.18 
## Item parametrləri: a = 1.16 , b = -0.56 , c = 0.24 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.515 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -0.953 
## Posterior SE: 0.333 
## 
##   θ̂ = -0.953 , SE = 0.333 
##   Mütləq xəta: 0.047 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.333 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.333 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 20 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.953 
## Administered items sayı: 19 
## Available items sayı: 31 
## Seçilmiş item: 7 
## Fisher Information: 0.166 
## Item parametrləri: a = 0.94 , b = -0.71 , c = 0.12 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.509 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.91 
## Posterior SE: 0.324 
## 
##   θ̂ = -0.91 , SE = 0.324 
##   Mütləq xəta: 0.09 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.324 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.324 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 21 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.91 
## Administered items sayı: 20 
## Available items sayı: 30 
## Seçilmiş item: 47 
## Fisher Information: 0.172 
## Item parametrləri: a = 1.79 , b = -0.05 , c = 0.23 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.33 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.943 
## Posterior SE: 0.321 
## 
##   θ̂ = -0.943 , SE = 0.321 
##   Mütləq xəta: 0.057 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 22 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.943 
## Administered items sayı: 21 
## Available items sayı: 29 
## Seçilmiş item: 15 
## Fisher Information: 0.151 
## Item parametrləri: a = 1.82 , b = -0.05 , c = 0.25 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.381 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -0.894 
## Posterior SE: 0.319 
## 
##   θ̂ = -0.894 , SE = 0.319 
##   Mütləq xəta: 0.106 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.319 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.319 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 23 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.894 
## Administered items sayı: 22 
## Available items sayı: 28 
## Seçilmiş item: 46 
## Fisher Information: 0.145 
## Item parametrləri: a = 0.93 , b = -0.2 , c = 0.11 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.425 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.926 
## Posterior SE: 0.321 
## 
##   θ̂ = -0.926 , SE = 0.321 
##   Mütləq xəta: 0.074 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 24 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.926 
## Administered items sayı: 23 
## Available items sayı: 27 
## Seçilmiş item: 8 
## Fisher Information: 0.145 
## Item parametrləri: a = 1.29 , b = -2.4 , c = 0.2 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.859 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -0.911 
## Posterior SE: 0.315 
## 
##   θ̂ = -0.911 , SE = 0.315 
##   Mütləq xəta: 0.089 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.315 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.315 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 25 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.911 
## Administered items sayı: 24 
## Available items sayı: 26 
## Seçilmiş item: 45 
## Fisher Information: 0.143 
## Item parametrləri: a = 0.93 , b = -0.93 , c = 0.2 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.522 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: -0.881 
## Posterior SE: 0.309 
## 
##   θ̂ = -0.881 , SE = 0.309 
##   Mütləq xəta: 0.119 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 26 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.881 
## Administered items sayı: 25 
## Available items sayı: 25 
## Seçilmiş item: 22 
## Fisher Information: 0.134 
## Item parametrləri: a = 2.03 , b = 0.14 , c = 0.19 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.246 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: -0.903 
## Posterior SE: 0.306 
## 
##   θ̂ = -0.903 , SE = 0.306 
##   Mütləq xəta: 0.097 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.306 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.306 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 27 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.903 
## Administered items sayı: 26 
## Available items sayı: 24 
## Seçilmiş item: 19 
## Fisher Information: 0.126 
## Item parametrləri: a = 2.02 , b = 0.1 , c = 0.21 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.324 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0 
## EAP theta: -0.926 
## Posterior SE: 0.304 
## 
##   θ̂ = -0.926 , SE = 0.304 
##   Mütləq xəta: 0.074 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 28 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.926 
## Administered items sayı: 27 
## Available items sayı: 23 
## Seçilmiş item: 43 
## Fisher Information: 0.119 
## Item parametrləri: a = 0.87 , b = -1.72 , c = 0.22 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.738 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0 
## EAP theta: -0.979 
## Posterior SE: 0.31 
## 
##   θ̂ = -0.979 , SE = 0.31 
##   Mütləq xəta: 0.021 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 29 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.979 
## Administered items sayı: 28 
## Available items sayı: 22 
## Seçilmiş item: 10 
## Fisher Information: 0.108 
## Item parametrləri: a = 1.45 , b = 0.2 , c = 0.19 
## 
## Response generasiyası:
##   Cavab: 1 (P = 0.388 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1 
## EAP theta: -0.934 
## Posterior SE: 0.307 
## 
##   θ̂ = -0.934 , SE = 0.307 
##   Mütləq xəta: 0.066 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## ---
## >>> ADDIM 30 <<<
## Fisher Information əsaslı item seçimi
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.934 
## Administered items sayı: 29 
## Available items sayı: 21 
## Seçilmiş item: 21 
## Fisher Information: 0.099 
## Item parametrləri: a = 1.11 , b = 0.15 , c = 0.22 
## 
## Response generasiyası:
##   Cavab: 0 (P = 0.44 )
## Qabiliyyət qiymətləndirməsi:
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 0 
## EAP theta: -0.958 
## Posterior SE: 0.307 
## 
##   θ̂ = -0.958 , SE = 0.307 
##   Mütləq xəta: 0.042 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## >>> TEST SONLANDI <<<
## Səbəb: Maksimum item sayına çatıldı: 30 / 30 
## 
## Final qiymətləndirmə hesablanır...
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 0 
## EAP theta: -0.958 
## Posterior SE: 0.307

3.1 Simulyasiya Nəticələrinin Təhlili

cat("\n=== SİMULYASİYA NƏTİCƏLƏRİNİN TƏHLİLİ ===\n")
## 
## === SİMULYASİYA NƏTİCƏLƏRİNİN TƏHLİLİ ===
cat("Həqiqi qabiliyyət:", round(examinees$true_theta[1], 3), "\n")
## Həqiqi qabiliyyət: -1
cat("Qiymətləndirilmiş qabiliyyət:", round(single_result$final_theta, 3), "\n")
## Qiymətləndirilmiş qabiliyyət: -0.958
cat("Standart xəta:", round(single_result$final_se, 3), "\n")
## Standart xəta: 0.307
cat("İstifadə edilən tapşırıq sayı:", single_result$items_count, "\n")
## İstifadə edilən tapşırıq sayı: 30
cat("Doğru cavab nisbəti:", round(single_result$accuracy, 3), "\n")
## Doğru cavab nisbəti: 0.433
cat("Qiymətləndirmə xətası:", round(single_result$estimation_error, 3), "\n")
## Qiymətləndirmə xətası: 0.042
# İstifadə edilən itemlərin təhlili
used_items <- single_result$administered_items
used_item_params <- item_bank[used_items, ]

cat("\nİstifadə edilən itemlərin statistikaları:\n")
## 
## İstifadə edilən itemlərin statistikaları:
cat("a parametri - Orta:", round(mean(used_item_params$a), 3), 
    ", SD:", round(sd(used_item_params$a), 3), "\n")
## a parametri - Orta: 1.654 , SD: 0.509
cat("b parametri - Orta:", round(mean(used_item_params$b), 3), 
    ", SD:", round(sd(used_item_params$b), 3), "\n")
## b parametri - Orta: -0.579 , SD: 0.665
cat("c parametri - Orta:", round(mean(used_item_params$c), 3), 
    ", SD:", round(sd(used_item_params$c), 3), "\n")
## c parametri - Orta: 0.186 , SD: 0.042
# Konvergens qrafiki yaratmaq
if (length(single_result$theta_estimates) > 0) {
    
    convergence_data <- data.frame(
        Step = 2:(length(single_result$theta_estimates) + 1),
        Theta_Estimate = single_result$theta_estimates,
        SE = single_result$se_estimates,
        True_Theta = single_result$true_theta
    )
    
    cat("\nKonvergens məlumatları:\n")
    print(convergence_data)
    
    # Theta konvergensi qrafiki
    p1 <- ggplot(convergence_data, aes(x = Step)) +
        geom_line(aes(y = Theta_Estimate, color = "Qiymətləndirmə"), size = 1.2) +
        geom_point(aes(y = Theta_Estimate), color = "blue", size = 2) +
        geom_hline(aes(yintercept = True_Theta, color = "Həqiqi θ"), 
                   linetype = "dashed", size = 1) +
        geom_ribbon(aes(ymin = Theta_Estimate - SE, ymax = Theta_Estimate + SE), 
                    alpha = 0.3, fill = "lightblue") +
        labs(title = "CAT-da Theta Konvergensiyası",
             subtitle = paste("Test alıcısı - Həqiqi θ =", single_result$true_theta),
             x = "Test Addımı", y = "Theta Qiymətləndirməsi",
             color = "Tip") +
        theme_minimal() +
        scale_color_manual(values = c("Qiymətləndirmə" = "blue", "Həqiqi θ" = "red"))
    
    # SE azalması qrafiki
    p2 <- ggplot(convergence_data, aes(x = Step, y = SE)) +
        geom_line(size = 1.2, color = "red") +
        geom_point(size = 2, color = "red") +
        geom_hline(yintercept = 0.3, linetype = "dashed", color = "green", size = 1) +
        labs(title = "Standart Xəta Azalması",
             x = "Test Addımı", y = "Standart Xəta") +
        theme_minimal() +
        annotate("text", x = max(convergence_data$Step) * 0.7, y = 0.32,
                 label = "SE threshold = 0.3", color = "green", size = 3)
    
    grid.arrange(p1, p2, ncol = 1)
    
    # Response pattern analizi
    response_data <- data.frame(
        Step = 1:length(single_result$responses),
        Response = single_result$responses,
        Item_ID = single_result$administered_items
    )
    
    response_data$Item_Difficulty <- item_bank$b[response_data$Item_ID]
    response_data$Cumulative_Score <- cumsum(response_data$Response)
    response_data$Cumulative_Percent <- response_data$Cumulative_Score / response_data$Step * 100
    
    # Response pattern qrafiki
    p3 <- ggplot(response_data, aes(x = Step)) +
        geom_col(aes(y = Response * 100, fill = as.factor(Response)), alpha = 0.7) +
        geom_line(aes(y = Cumulative_Percent), color = "blue", size = 1.2) +
        labs(title = "Cavab Nümunəsi və Kumulativ Performans",
             x = "Test Addımı", y = "Faiz",
             fill = "Cavab") +
        theme_minimal() +
        scale_fill_manual(values = c("0" = "red", "1" = "green"), 
                         labels = c("0" = "Yanlış", "1" = "Doğru"))
    
    # Item çətinliyi vs Addım
    p4 <- ggplot(response_data, aes(x = Step, y = Item_Difficulty, color = as.factor(Response))) +
        geom_point(size = 3) +
        geom_line(alpha = 0.5) +
        labs(title = "Seçilmiş Itemlərin Çətinlik Səviyyəsi",
             x = "Test Addımı", y = "Item Çətinliyi (b)",
             color = "Cavab") +
        theme_minimal() +
        scale_color_manual(values = c("0" = "red", "1" = "green"), 
                          labels = c("0" = "Yanlış", "1" = "Doğru"))
    
    grid.arrange(p3, p4, ncol = 1)
}
## 
## Konvergens məlumatları:
##    Step Theta_Estimate        SE True_Theta
## 1     2     -0.9822297 0.6667709         -1
## 2     3     -0.7807405 0.5912671         -1
## 3     4     -0.6363110 0.5200467         -1
## 4     5     -0.8411937 0.4836383         -1
## 5     6     -0.7049355 0.4465722         -1
## 6     7     -0.8290628 0.4293409         -1
## 7     8     -0.7615462 0.4024098         -1
## 8     9     -0.8438554 0.3862031         -1
## 9    10     -0.9029060 0.3782096         -1
## 10   11     -0.9617469 0.3769920         -1
## 11   12     -0.9343482 0.3626911         -1
## 12   13     -0.9721936 0.3586160         -1
## 13   14     -1.0360167 0.3609785         -1
## 14   15     -0.9842800 0.3482652         -1
## 15   16     -0.8999869 0.3387670         -1
## 16   17     -0.9493542 0.3411105         -1
## 17   18     -0.9042996 0.3309598         -1
## 18   19     -0.9530720 0.3332946         -1
## 19   20     -0.9104008 0.3236669         -1
## 20   21     -0.9428127 0.3211625         -1
## 21   22     -0.8937951 0.3186851         -1
## 22   23     -0.9255666 0.3207293         -1
## 23   24     -0.9110754 0.3153281         -1
## 24   25     -0.8813182 0.3091600         -1
## 25   26     -0.9033933 0.3064360         -1
## 26   27     -0.9257699 0.3039528         -1
## 27   28     -0.9791253 0.3104208         -1
## 28   29     -0.9344379 0.3065141         -1
## 29   30     -0.9579447 0.3073655         -1

4 Çoxlu Test Alıcısı Simulyasiyası

# Çoxlu test alıcısı üçün simulyasiya
run_multiple_simulations <- function(examinees_df, item_bank, 
                                    min_items = 5, max_items = 30, se_threshold = 0.3) {
    
    cat("=== ÇOXLU TEST ALICISI SİMULYASİYASI ===\n")
    cat("Test alıcı sayı:", nrow(examinees_df), "\n")
    cat("Item bank ölçüsü:", nrow(item_bank), "\n\n")
    
    results_list <- list()
    
    for (i in 1:nrow(examinees_df)) {
        cat("Test alıcısı", i, "/", nrow(examinees_df), 
            "(θ =", examinees_df$true_theta[i], ") işlənir...\n")
        
        # Simulyasiya aparma (verbose = FALSE)
        result <- run_cat_simulation(
            examinee_ability = examinees_df$true_theta[i],
            item_bank = item_bank,
            min_items = min_items,
            max_items = max_items,
            se_threshold = se_threshold,
            verbose = FALSE
        )
        
        # Examinee ID əlavə etmə
        result$examinee_id <- examinees_df$id[i]
        results_list[[i]] <- result
        
        cat("  Tamamlandı: Items =", result$items_count, 
            ", Final θ =", round(result$final_theta, 3), 
            ", SE =", round(result$final_se, 3), "\n")
    }
    
    cat("\nBütün simulyasiyalar tamamlandı!\n\n")
    return(results_list)
}

# Çoxlu test alıcısı simulyasiyası
multiple_results <- run_multiple_simulations(examinees, item_bank)
## === ÇOXLU TEST ALICISI SİMULYASİYASI ===
## Test alıcı sayı: 3 
## Item bank ölçüsü: 50 
## 
## Test alıcısı 1 / 3 (θ = -1 ) işlənir...
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 49 
## Seçilmiş item: 27 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.42 , b = -0.31 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.982 
## Posterior SE: 0.667 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.667 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.982 
## Administered items sayı: 2 
## Available items sayı: 48 
## Seçilmiş item: 37 
## Fisher Information: 0.964 
## Item parametrləri: a = 2.48 , b = -1.18 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 0 
## EAP theta: -1.427 
## Posterior SE: 0.606 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.606 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.427 
## Administered items sayı: 3 
## Available items sayı: 47 
## Seçilmiş item: 5 
## Fisher Information: 0.84 
## Item parametrləri: a = 2.14 , b = -1.31 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 0, 1 
## EAP theta: -1.189 
## Posterior SE: 0.536 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.536 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.189 
## Administered items sayı: 4 
## Available items sayı: 46 
## Seçilmiş item: 26 
## Fisher Information: 0.513 
## Item parametrləri: a = 2 , b = -0.8 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 0, 1, 1 
## EAP theta: -1.008 
## Posterior SE: 0.503 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.503 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.503 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.008 
## Administered items sayı: 5 
## Available items sayı: 45 
## Seçilmiş item: 14 
## Fisher Information: 0.481 
## Item parametrləri: a = 2.2 , b = -0.51 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 0, 1, 1, 0 
## EAP theta: -1.134 
## Posterior SE: 0.481 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.481 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.481 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.134 
## Administered items sayı: 6 
## Available items sayı: 44 
## Seçilmiş item: 24 
## Fisher Information: 0.466 
## Item parametrləri: a = 1.56 , b = -1.41 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 0, 1, 1, 0, 0 
## EAP theta: -1.326 
## Posterior SE: 0.493 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.493 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.493 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.326 
## Administered items sayı: 7 
## Available items sayı: 43 
## Seçilmiş item: 48 
## Fisher Information: 0.367 
## Item parametrləri: a = 1.72 , b = -2.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1 
## EAP theta: -1.257 
## Posterior SE: 0.457 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.457 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.457 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.257 
## Administered items sayı: 8 
## Available items sayı: 42 
## Seçilmiş item: 3 
## Fisher Information: 0.219 
## Item parametrləri: a = 2.05 , b = -0.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1 
## EAP theta: -1.122 
## Posterior SE: 0.449 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.449 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.449 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.122 
## Administered items sayı: 9 
## Available items sayı: 41 
## Seçilmiş item: 18 
## Fisher Information: 0.222 
## Item parametrləri: a = 1.57 , b = -0.3 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: -1.007 
## Posterior SE: 0.433 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.433 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.433 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.007 
## Administered items sayı: 10 
## Available items sayı: 40 
## Seçilmiş item: 13 
## Fisher Information: 0.251 
## Item parametrləri: a = 2.08 , b = -0.17 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1 
## EAP theta: -0.874 
## Posterior SE: 0.423 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.423 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.423 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.874 
## Administered items sayı: 11 
## Available items sayı: 39 
## Seçilmiş item: 38 
## Fisher Information: 0.351 
## Item parametrləri: a = 2.36 , b = -0.24 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1 
## EAP theta: -0.751 
## Posterior SE: 0.414 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.414 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.414 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.751 
## Administered items sayı: 12 
## Available items sayı: 38 
## Seçilmiş item: 16 
## Fisher Information: 0.364 
## Item parametrləri: a = 1.91 , b = -0.03 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.814 
## Posterior SE: 0.408 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.408 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.408 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.814 
## Administered items sayı: 13 
## Available items sayı: 37 
## Seçilmiş item: 40 
## Fisher Information: 0.291 
## Item parametrləri: a = 1.7 , b = -0.05 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0 
## EAP theta: -0.871 
## Posterior SE: 0.406 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.406 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.406 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.871 
## Administered items sayı: 14 
## Available items sayı: 36 
## Seçilmiş item: 6 
## Fisher Information: 0.254 
## Item parametrləri: a = 1.36 , b = -0.63 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0 
## EAP theta: -0.958 
## Posterior SE: 0.412 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.412 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.412 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.958 
## Administered items sayı: 15 
## Available items sayı: 35 
## Seçilmiş item: 12 
## Fisher Information: 0.219 
## Item parametrləri: a = 1.17 , b = -0.79 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0 
## EAP theta: -1.042 
## Posterior SE: 0.422 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.422 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.422 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.042 
## Administered items sayı: 16 
## Available items sayı: 34 
## Seçilmiş item: 44 
## Fisher Information: 0.17 
## Item parametrləri: a = 1.02 , b = -0.65 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0 
## EAP theta: -1.111 
## Posterior SE: 0.431 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.431 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.431 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.111 
## Administered items sayı: 17 
## Available items sayı: 33 
## Seçilmiş item: 8 
## Fisher Information: 0.171 
## Item parametrləri: a = 1.29 , b = -2.4 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1 
## EAP theta: -1.078 
## Posterior SE: 0.413 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.413 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.413 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.078 
## Administered items sayı: 18 
## Available items sayı: 32 
## Seçilmiş item: 32 
## Fisher Information: 0.162 
## Item parametrləri: a = 1.17 , b = -0.5 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1 
## EAP theta: -1.014 
## Posterior SE: 0.398 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.398 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.398 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.014 
## Administered items sayı: 19 
## Available items sayı: 31 
## Seçilmiş item: 2 
## Fisher Information: 0.169 
## Item parametrləri: a = 1.16 , b = -0.56 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0 
## EAP theta: -1.078 
## Posterior SE: 0.403 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.403 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.403 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.078 
## Administered items sayı: 20 
## Available items sayı: 30 
## Seçilmiş item: 7 
## Fisher Information: 0.161 
## Item parametrləri: a = 0.94 , b = -0.71 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1 
## EAP theta: -1.015 
## Posterior SE: 0.385 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.385 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.385 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.015 
## Administered items sayı: 21 
## Available items sayı: 29 
## Seçilmiş item: 45 
## Fisher Information: 0.141 
## Item parametrləri: a = 0.93 , b = -0.93 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1 
## EAP theta: -0.97 
## Posterior SE: 0.373 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.373 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.373 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.97 
## Administered items sayı: 22 
## Available items sayı: 28 
## Seçilmiş item: 47 
## Fisher Information: 0.152 
## Item parametrləri: a = 1.79 , b = -0.05 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0 
## EAP theta: -1.009 
## Posterior SE: 0.37 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.37 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.37 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.009 
## Administered items sayı: 23 
## Available items sayı: 27 
## Seçilmiş item: 46 
## Fisher Information: 0.137 
## Item parametrləri: a = 0.93 , b = -0.2 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1 
## EAP theta: -0.949 
## Posterior SE: 0.357 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.357 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.357 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.949 
## Administered items sayı: 24 
## Available items sayı: 26 
## Seçilmiş item: 15 
## Fisher Information: 0.149 
## Item parametrləri: a = 1.82 , b = -0.05 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: -0.986 
## Posterior SE: 0.354 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.354 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.354 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.986 
## Administered items sayı: 25 
## Available items sayı: 25 
## Seçilmiş item: 43 
## Fisher Information: 0.121 
## Item parametrləri: a = 0.87 , b = -1.72 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.959 
## Posterior SE: 0.346 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.346 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.346 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.959 
## Administered items sayı: 26 
## Available items sayı: 24 
## Seçilmiş item: 10 
## Fisher Information: 0.112 
## Item parametrləri: a = 1.45 , b = 0.2 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.986 
## Posterior SE: 0.346 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.346 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.346 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.986 
## Administered items sayı: 27 
## Available items sayı: 23 
## Seçilmiş item: 22 
## Fisher Information: 0.099 
## Item parametrləri: a = 2.03 , b = 0.14 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 0 
## EAP theta: -1.009 
## Posterior SE: 0.343 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.343 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.343 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.009 
## Administered items sayı: 28 
## Available items sayı: 22 
## Seçilmiş item: 19 
## Fisher Information: 0.093 
## Item parametrləri: a = 2.02 , b = 0.1 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0 
## EAP theta: -1.032 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.032 
## Administered items sayı: 29 
## Available items sayı: 21 
## Seçilmiş item: 21 
## Fisher Information: 0.089 
## Item parametrləri: a = 1.11 , b = 0.15 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1 
## EAP theta: -0.991 
## Posterior SE: 0.335 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.335 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 0, 1, 1, 0, 0, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 1 
## EAP theta: -0.991 
## Posterior SE: 0.335 
## 
##   Tamamlandı: Items = 30 , Final θ = -0.991 , SE = 0.335 
## Test alıcısı 2 / 3 (θ = 0 ) işlənir...
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 49 
## Seçilmiş item: 27 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.42 , b = -0.31 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.313 
## Posterior SE: 0.703 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.703 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.313 
## Administered items sayı: 2 
## Available items sayı: 48 
## Seçilmiş item: 38 
## Fisher Information: 0.892 
## Item parametrləri: a = 2.36 , b = -0.24 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 1 
## EAP theta: -0.056 
## Posterior SE: 0.627 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.627 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.056 
## Administered items sayı: 3 
## Available items sayı: 47 
## Seçilmiş item: 13 
## Fisher Information: 0.814 
## Item parametrləri: a = 2.08 , b = -0.17 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 1, 1 
## EAP theta: 0.146 
## Posterior SE: 0.556 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.556 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.146 
## Administered items sayı: 4 
## Available items sayı: 46 
## Seçilmiş item: 16 
## Fisher Information: 0.726 
## Item parametrləri: a = 1.91 , b = -0.03 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 1, 1, 1 
## EAP theta: 0.309 
## Posterior SE: 0.512 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.512 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.512 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.309 
## Administered items sayı: 5 
## Available items sayı: 45 
## Seçilmiş item: 17 
## Fisher Information: 0.787 
## Item parametrləri: a = 2.23 , b = 0.47 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 1, 1, 1, 0 
## EAP theta: 0.115 
## Posterior SE: 0.453 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.453 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.453 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.115 
## Administered items sayı: 6 
## Available items sayı: 44 
## Seçilmiş item: 22 
## Fisher Information: 0.7 
## Item parametrləri: a = 2.03 , b = 0.14 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.234 
## Posterior SE: 0.429 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.429 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.429 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.234 
## Administered items sayı: 7 
## Available items sayı: 43 
## Seçilmiş item: 19 
## Fisher Information: 0.676 
## Item parametrləri: a = 2.02 , b = 0.1 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 0.327 
## Posterior SE: 0.411 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.411 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.411 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.327 
## Administered items sayı: 8 
## Available items sayı: 42 
## Seçilmiş item: 25 
## Fisher Information: 0.705 
## Item parametrləri: a = 2.23 , b = 0.49 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 0.436 
## Posterior SE: 0.404 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.404 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.404 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.436 
## Administered items sayı: 9 
## Available items sayı: 41 
## Seçilmiş item: 31 
## Fisher Information: 0.675 
## Item parametrləri: a = 2.46 , b = 0.88 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: 0.339 
## Posterior SE: 0.372 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.372 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.372 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.339 
## Administered items sayı: 10 
## Available items sayı: 40 
## Seçilmiş item: 23 
## Fisher Information: 0.549 
## Item parametrləri: a = 2.34 , b = 0.92 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0 
## EAP theta: 0.273 
## Posterior SE: 0.355 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.355 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.355 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.273 
## Administered items sayı: 11 
## Available items sayı: 39 
## Seçilmiş item: 40 
## Fisher Information: 0.544 
## Item parametrləri: a = 1.7 , b = -0.05 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1 
## EAP theta: 0.334 
## Posterior SE: 0.339 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.339 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.339 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.334 
## Administered items sayı: 12 
## Available items sayı: 38 
## Seçilmiş item: 3 
## Fisher Information: 0.504 
## Item parametrləri: a = 2.05 , b = -0.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1 
## EAP theta: 0.37 
## Posterior SE: 0.328 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.328 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.328 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.37 
## Administered items sayı: 13 
## Available items sayı: 37 
## Seçilmiş item: 15 
## Fisher Information: 0.485 
## Item parametrləri: a = 1.82 , b = -0.05 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: 0.41 
## Posterior SE: 0.32 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.32 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.32 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.41 
## Administered items sayı: 14 
## Available items sayı: 36 
## Seçilmiş item: 34 
## Fisher Information: 0.496 
## Item parametrləri: a = 1.65 , b = 0.65 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0 
## EAP theta: 0.346 
## Posterior SE: 0.311 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.311 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.311 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.346 
## Administered items sayı: 15 
## Available items sayı: 35 
## Seçilmiş item: 47 
## Fisher Information: 0.49 
## Item parametrləri: a = 1.79 , b = -0.05 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0 
## EAP theta: 0.238 
## Posterior SE: 0.306 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.306 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.306 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.238 
## Administered items sayı: 16 
## Available items sayı: 34 
## Seçilmiş item: 14 
## Fisher Information: 0.519 
## Item parametrləri: a = 2.2 , b = -0.51 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.077 
## Posterior SE: 0.308 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.308 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.308 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.077 
## Administered items sayı: 17 
## Available items sayı: 33 
## Seçilmiş item: 18 
## Fisher Information: 0.437 
## Item parametrləri: a = 1.57 , b = -0.3 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.117 
## Posterior SE: 0.298 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.298 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.298 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.117 
## Posterior SE: 0.298 
## 
##   Tamamlandı: Items = 18 , Final θ = 0.117 , SE = 0.298 
## Test alıcısı 3 / 3 (θ = 1.5 ) işlənir...
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 49 
## Seçilmiş item: 27 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.42 , b = -0.31 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.666 
## Posterior SE: 0.781 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.781 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.666 
## Administered items sayı: 2 
## Available items sayı: 48 
## Seçilmiş item: 31 
## Fisher Information: 0.963 
## Item parametrləri: a = 2.46 , b = 0.88 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 1.044 
## Posterior SE: 0.731 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.731 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.044 
## Administered items sayı: 3 
## Available items sayı: 47 
## Seçilmiş item: 23 
## Fisher Information: 1.101 
## Item parametrləri: a = 2.34 , b = 0.92 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 0 
## EAP theta: 0.604 
## Posterior SE: 0.609 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.609 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.604 
## Administered items sayı: 4 
## Available items sayı: 46 
## Seçilmiş item: 17 
## Fisher Information: 0.883 
## Item parametrləri: a = 2.23 , b = 0.47 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 0, 1 
## EAP theta: 0.792 
## Posterior SE: 0.543 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.543 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.543 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.792 
## Administered items sayı: 5 
## Available items sayı: 45 
## Seçilmiş item: 39 
## Fisher Information: 0.876 
## Item parametrləri: a = 2.39 , b = 1.08 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 0, 1, 0 
## EAP theta: 0.6 
## Posterior SE: 0.497 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.497 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.497 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.6 
## Administered items sayı: 6 
## Available items sayı: 44 
## Seçilmiş item: 25 
## Fisher Information: 0.807 
## Item parametrləri: a = 2.23 , b = 0.49 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.725 
## Posterior SE: 0.452 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.452 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.452 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.725 
## Administered items sayı: 7 
## Available items sayı: 43 
## Seçilmiş item: 22 
## Fisher Information: 0.569 
## Item parametrləri: a = 2.03 , b = 0.14 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.799 
## Posterior SE: 0.419 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.419 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.419 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.799 
## Administered items sayı: 8 
## Available items sayı: 42 
## Seçilmiş item: 28 
## Fisher Information: 0.582 
## Item parametrləri: a = 1.89 , b = 0.81 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.893 
## Posterior SE: 0.402 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.402 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.402 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.893 
## Administered items sayı: 9 
## Available items sayı: 41 
## Seçilmiş item: 35 
## Fisher Information: 0.576 
## Item parametrləri: a = 1.91 , b = 0.69 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: 0.967 
## Posterior SE: 0.388 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.388 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.388 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.967 
## Administered items sayı: 10 
## Available items sayı: 40 
## Seçilmiş item: 34 
## Fisher Information: 0.529 
## Item parametrləri: a = 1.65 , b = 0.65 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 0.827 
## Posterior SE: 0.375 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.375 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.375 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.827 
## Administered items sayı: 11 
## Available items sayı: 39 
## Seçilmiş item: 19 
## Fisher Information: 0.465 
## Item parametrləri: a = 2.02 , b = 0.1 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.868 
## Posterior SE: 0.36 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.36 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.36 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.868 
## Administered items sayı: 12 
## Available items sayı: 38 
## Seçilmiş item: 16 
## Fisher Information: 0.407 
## Item parametrləri: a = 1.91 , b = -0.03 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.674 
## Posterior SE: 0.359 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.359 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.359 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.674 
## Administered items sayı: 13 
## Available items sayı: 37 
## Seçilmiş item: 13 
## Fisher Information: 0.452 
## Item parametrləri: a = 2.08 , b = -0.17 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.71 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.71 
## Administered items sayı: 14 
## Available items sayı: 36 
## Seçilmiş item: 40 
## Fisher Information: 0.411 
## Item parametrləri: a = 1.7 , b = -0.05 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.747 
## Posterior SE: 0.333 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.333 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.333 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.747 
## Administered items sayı: 15 
## Available items sayı: 35 
## Seçilmiş item: 47 
## Fisher Information: 0.365 
## Item parametrləri: a = 1.79 , b = -0.05 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.776 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.776 
## Administered items sayı: 16 
## Available items sayı: 34 
## Seçilmiş item: 15 
## Fisher Information: 0.353 
## Item parametrləri: a = 1.82 , b = -0.05 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: 0.802 
## Posterior SE: 0.32 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.32 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.32 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.802 
## Administered items sayı: 17 
## Available items sayı: 33 
## Seçilmiş item: 10 
## Fisher Information: 0.332 
## Item parametrləri: a = 1.45 , b = 0.2 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 0.834 
## Posterior SE: 0.315 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.315 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.315 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.834 
## Administered items sayı: 18 
## Available items sayı: 32 
## Seçilmiş item: 38 
## Fisher Information: 0.297 
## Item parametrləri: a = 2.36 , b = -0.24 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.85 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.85 
## Administered items sayı: 19 
## Available items sayı: 31 
## Seçilmiş item: 18 
## Fisher Information: 0.245 
## Item parametrləri: a = 1.57 , b = -0.3 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.868 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.868 
## Administered items sayı: 20 
## Available items sayı: 30 
## Seçilmiş item: 9 
## Fisher Information: 0.243 
## Item parametrləri: a = 1.2 , b = 0.36 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.897 
## Posterior SE: 0.305 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.305 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.305 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.897 
## Administered items sayı: 21 
## Available items sayı: 29 
## Seçilmiş item: 4 
## Fisher Information: 0.252 
## Item parametrləri: a = 2.25 , b = 1.78 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.984 
## Posterior SE: 0.317 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.317 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.317 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.984 
## Administered items sayı: 22 
## Available items sayı: 28 
## Seçilmiş item: 49 
## Fisher Information: 0.25 
## Item parametrləri: a = 1.63 , b = 1.73 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 0.947 
## Posterior SE: 0.308 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.308 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.308 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.947 
## Administered items sayı: 23 
## Available items sayı: 27 
## Seçilmiş item: 30 
## Fisher Information: 0.239 
## Item parametrləri: a = 1.23 , b = 0.74 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.978 
## Posterior SE: 0.306 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.306 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.306 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.978 
## Administered items sayı: 24 
## Available items sayı: 26 
## Seçilmiş item: 33 
## Fisher Information: 0.214 
## Item parametrləri: a = 2.43 , b = 1.87 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.061 
## Posterior SE: 0.319 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.319 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.319 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.061 
## Administered items sayı: 25 
## Available items sayı: 25 
## Seçilmiş item: 42 
## Fisher Information: 0.23 
## Item parametrləri: a = 1.52 , b = 1.88 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 1.128 
## Posterior SE: 0.323 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.323 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.323 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.128 
## Administered items sayı: 26 
## Available items sayı: 24 
## Seçilmiş item: 41 
## Fisher Information: 0.179 
## Item parametrləri: a = 1.34 , b = 1.98 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: 1.094 
## Posterior SE: 0.316 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.316 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.316 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.094 
## Administered items sayı: 27 
## Available items sayı: 23 
## Seçilmiş item: 21 
## Fisher Information: 0.17 
## Item parametrləri: a = 1.11 , b = 0.15 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: 1.115 
## Posterior SE: 0.314 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.314 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.314 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.115 
## Administered items sayı: 28 
## Available items sayı: 22 
## Seçilmiş item: 11 
## Fisher Information: 0.17 
## Item parametrləri: a = 1.43 , b = 2.18 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.179 
## Posterior SE: 0.318 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.318 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.318 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.179 
## Administered items sayı: 29 
## Available items sayı: 21 
## Seçilmiş item: 29 
## Fisher Information: 0.157 
## Item parametrləri: a = 0.93 , b = 1.08 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 1.131 
## Posterior SE: 0.314 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.314 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 1.131 
## Posterior SE: 0.314 
## 
##   Tamamlandı: Items = 30 , Final θ = 1.131 , SE = 0.314 
## 
## Bütün simulyasiyalar tamamlandı!
# Nəticələri data frame formatına çevirmə
extract_simulation_summary <- function(results_list) {
    
    summary_data <- data.frame(
        Examinee_ID = sapply(results_list, function(x) x$examinee_id),
        True_Theta = sapply(results_list, function(x) x$true_theta),
        Final_Theta = sapply(results_list, function(x) x$final_theta),
        Final_SE = sapply(results_list, function(x) x$final_se),
        Items_Count = sapply(results_list, function(x) x$items_count),
        Accuracy = sapply(results_list, function(x) x$accuracy),
        Estimation_Error = sapply(results_list, function(x) x$estimation_error),
        Bias = sapply(results_list, function(x) x$final_theta - x$true_theta)
    )
    
    return(summary_data)
}

simulation_summary <- extract_simulation_summary(multiple_results)

cat("=== ÇOXLU SİMULYASİYA NƏTİCƏLƏRİ ===\n")
## === ÇOXLU SİMULYASİYA NƏTİCƏLƏRİ ===
print(simulation_summary)
##   Examinee_ID True_Theta Final_Theta  Final_SE Items_Count  Accuracy
## 1           1       -1.0  -0.9908638 0.3345815          30 0.4666667
## 2           2        0.0   0.1170191 0.2978497          18 0.6111111
## 3           3        1.5   1.1312928 0.3136253          30 0.7666667
##   Estimation_Error         Bias
## 1      0.009136171  0.009136171
## 2      0.117019100  0.117019100
## 3      0.368707233 -0.368707233
# Əsas statistikaların hesablanması
cat("\n=== ƏSAS STATİSTİKALAR ===\n")
## 
## === ƏSAS STATİSTİKALAR ===
cat("Orta test uzunluğu:", round(mean(simulation_summary$Items_Count), 1), "\n")
## Orta test uzunluğu: 26
cat("Test uzunluğu SD:", round(sd(simulation_summary$Items_Count), 1), "\n")
## Test uzunluğu SD: 6.9
cat("Orta final SE:", round(mean(simulation_summary$Final_SE), 3), "\n")
## Orta final SE: 0.315
cat("Orta qiymətləndirmə xətası:", round(mean(simulation_summary$Estimation_Error), 3), "\n")
## Orta qiymətləndirmə xətası: 0.165
cat("RMSE:", round(sqrt(mean(simulation_summary$Estimation_Error^2)), 3), "\n")
## RMSE: 0.223
cat("Orta bias:", round(mean(simulation_summary$Bias), 3), "\n")
## Orta bias: -0.081
cat("Bias SD:", round(sd(simulation_summary$Bias), 3), "\n")
## Bias SD: 0.255
# Performans qrafiklərinin yaradılması
create_performance_plots <- function(simulation_summary) {
    
    # 1. True vs Estimated Theta
    p1 <- ggplot(simulation_summary, aes(x = True_Theta, y = Final_Theta)) +
        geom_point(size = 3, color = "blue", alpha = 0.7) +
        geom_abline(intercept = 0, slope = 1, linetype = "dashed", color = "red", size = 1) +
        geom_smooth(method = "lm", se = TRUE, color = "green") +
        labs(title = "Həqiqi vs Qiymətləndirilmiş Qabiliyyət",
             x = "Həqiqi θ", y = "Qiymətləndirilmiş θ") +
        theme_minimal() +
        coord_equal()
    
    # 2. Test uzunluğu paylanması
    p2 <- ggplot(simulation_summary, aes(x = Items_Count)) +
        geom_histogram(bins = 10, fill = "lightblue", color = "black", alpha = 0.7) +
        geom_vline(xintercept = mean(simulation_summary$Items_Count), 
                   color = "red", linetype = "dashed", size = 1) +
        labs(title = "Test Uzunluğu Paylanması",
             subtitle = paste("Orta =", round(mean(simulation_summary$Items_Count), 1)),
             x = "Test Uzunluğu", y = "Tezlik") +
        theme_minimal()
    
    # 3. SE vs Test uzunluğu
    p3 <- ggplot(simulation_summary, aes(x = Items_Count, y = Final_SE)) +
        geom_point(size = 3, color = "darkgreen", alpha = 0.7) +
        geom_smooth(method = "loess", se = TRUE, color = "red") +
        geom_hline(yintercept = 0.3, linetype = "dashed", color = "blue") +
        labs(title = "Test Uzunluğu vs Final SE",
             x = "Test Uzunluğu", y = "Final SE") +
        theme_minimal() +
        annotate("text", x = max(simulation_summary$Items_Count) * 0.8, y = 0.32,
                 label = "SE threshold = 0.3", color = "blue")
    
    # 4. Xəta vs True Theta
    p4 <- ggplot(simulation_summary, aes(x = True_Theta, y = Estimation_Error)) +
        geom_point(size = 3, color = "darkred", alpha = 0.7) +
        geom_smooth(method = "loess", se = TRUE, color = "blue") +
        labs(title = "Həqiqi Qabiliyyət vs Qiymətləndirmə Xətası",
             x = "Həqiqi θ", y = "Mütləq Qiymətləndirmə Xətası") +
        theme_minimal()
    
    return(list(p1 = p1, p2 = p2, p3 = p3, p4 = p4))
}

# Performans qrafiklərini yaratmaq və göstərmək
performance_plots <- create_performance_plots(simulation_summary)
grid.arrange(performance_plots$p1, performance_plots$p2, 
             performance_plots$p3, performance_plots$p4, ncol = 2)

5 Geniş Miqyaslı Simulyasiya

# Geniş miqyaslı simulyasiya funksiyası
run_large_scale_simulation <- function(n_examinees = 100, 
                                      theta_mean = 0, theta_sd = 1,
                                      item_bank_size = 200,
                                      min_items = 5, max_items = 30, se_threshold = 0.3,
                                      seed = NULL) {
    
    if (!is.null(seed)) set.seed(seed)
    
    cat("=== GENİş MİQYASLI CAT SİMULYASİYASI ===\n")
    cat("Test alıcı sayı:", n_examinees, "\n")
    cat("Item bank ölçüsü:", item_bank_size, "\n")
    cat("Theta parametrləri: μ =", theta_mean, ", σ =", theta_sd, "\n")
    cat("Test parametrləri: min =", min_items, ", max =", max_items, ", SE ≤", se_threshold, "\n\n")
    
    # Böyük item bank yaratmaq
    large_item_bank <- data.frame(
        a = runif(item_bank_size, 0.8, 2.5),
        b = rnorm(item_bank_size, 0, 1.2),
        c = runif(item_bank_size, 0.1, 0.25)
    )
    
    # Test alıcıları yaratmaq
    large_examinees <- data.frame(
        id = 1:n_examinees,
        true_theta = rnorm(n_examinees, theta_mean, theta_sd)
    )
    
    cat("Item bank statistikaları:\n")
    cat("  a aralığı:", round(range(large_item_bank$a), 2), "\n")
    cat("  b aralığı:", round(range(large_item_bank$b), 2), "\n")
    cat("  c aralığı:", round(range(large_item_bank$c), 2), "\n\n")
    
    cat("Test alıcıları statistikaları:\n")
    cat("  θ aralığı:", round(range(large_examinees$true_theta), 2), "\n")
    cat("  θ ortası:", round(mean(large_examinees$true_theta), 3), "\n")
    cat("  θ SD:", round(sd(large_examinees$true_theta), 3), "\n\n")
    
    # Simulyasiya irəliləyişi
    large_results <- list()
    progress_points <- floor(seq(1, n_examinees, length.out = 10))
    
    start_time <- Sys.time()
    
    for (i in 1:n_examinees) {
        
        # CAT simulyasiyası (verbose = FALSE)
        result <- run_cat_simulation(
            examinee_ability = large_examinees$true_theta[i],
            item_bank = large_item_bank,
            min_items = min_items,
            max_items = max_items,
            se_threshold = se_threshold,
            verbose = FALSE
        )
        
        result$examinee_id <- large_examinees$id[i]
        large_results[[i]] <- result
        
        # Progress göstərmə
        if (i %in% progress_points) {
            progress_percent <- round(100 * i / n_examinees)
            elapsed_time <- as.numeric(Sys.time() - start_time)
            estimated_total <- elapsed_time * n_examinees / i
            remaining_time <- estimated_total - elapsed_time
            
            cat("İrəliləyiş:", progress_percent, "% (", i, "/", n_examinees, ")")
            cat(" - Qalan vaxt: ", round(remaining_time/60, 1), " dəqiqə\n")
        }
    }
    
    end_time <- Sys.time()
    total_time <- as.numeric(end_time - start_time)
    
    cat("\nSimulyasiya tamamlandı!\n")
    cat("Toplam vaxt:", round(total_time/60, 2), "dəqiqə\n")
    cat("Test alıcısı başına orta vaxt:", round(total_time/n_examinees, 3), "saniyə\n\n")
    
    return(list(
        results = large_results,
        item_bank = large_item_bank,
        examinees = large_examinees,
        simulation_time = total_time
    ))
}

# Orta ölçülü simulyasiya (demostrasi üçün)
cat("Orta ölçülü simulyasiya başladılır...\n")
## Orta ölçülü simulyasiya başladılır...
medium_simulation <- run_large_scale_simulation(
    n_examinees = 25,  # Demo üçün kiçik ölçü
    item_bank_size = 100,
    seed = 12345
)
## === GENİş MİQYASLI CAT SİMULYASİYASI ===
## Test alıcı sayı: 25 
## Item bank ölçüsü: 100 
## Theta parametrləri: μ = 0 , σ = 1 
## Test parametrləri: min = 5 , max = 30 , SE ≤ 0.3 
## 
## Item bank statistikaları:
##   a aralığı: 0.8 2.48 
##   b aralığı: -2.82 3.19 
##   c aralığı: 0.1 0.25 
## 
## Test alıcıları statistikaları:
##   θ aralığı: -2.29 2.07 
##   θ ortası: -0.098 
##   θ SD: 1.143 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 1 
## EAP theta: -0.699 
## Posterior SE: 0.598 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.598 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.699 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.815 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 1, 1 
## EAP theta: -0.473 
## Posterior SE: 0.531 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.531 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.473 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 38 
## Fisher Information: 0.84 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 1, 1, 0 
## EAP theta: -0.697 
## Posterior SE: 0.489 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.489 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.489 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.697 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 41 
## Fisher Information: 0.684 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 1, 1, 0, 0 
## EAP theta: -0.997 
## Posterior SE: 0.493 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.493 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.493 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.997 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 91 
## Fisher Information: 0.839 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 1, 1, 0, 0, 1 
## EAP theta: -0.889 
## Posterior SE: 0.442 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.442 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.442 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.889 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 87 
## Fisher Information: 0.79 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1 
## EAP theta: -0.795 
## Posterior SE: 0.406 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.406 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.406 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.795 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 52 
## Fisher Information: 0.626 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0 
## EAP theta: -1.042 
## Posterior SE: 0.408 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.408 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.408 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.042 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 61 
## Fisher Information: 0.776 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1 
## EAP theta: -0.962 
## Posterior SE: 0.373 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.373 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.373 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.962 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 20 
## Fisher Information: 0.663 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1 
## EAP theta: -0.913 
## Posterior SE: 0.354 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.354 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.354 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.913 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 28 
## Fisher Information: 0.61 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1 
## EAP theta: -0.836 
## Posterior SE: 0.34 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.34 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.34 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.836 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 50 
## Fisher Information: 0.563 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: -0.933 
## Posterior SE: 0.328 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.328 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.328 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.933 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 92 
## Fisher Information: 0.564 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0 
## EAP theta: -1.102 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.102 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 76 
## Fisher Information: 0.608 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1 
## EAP theta: -1.05 
## Posterior SE: 0.312 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.312 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.312 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.05 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 97 
## Fisher Information: 0.463 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1, 0 
## EAP theta: -1.206 
## Posterior SE: 0.317 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.317 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.317 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.206 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 94 
## Fisher Information: 0.526 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: -1.167 
## Posterior SE: 0.304 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.167 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 42 
## Fisher Information: 0.367 
## Item parametrləri: a = 1.53 , b = -1.03 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1, 0, 1, 0 
## EAP theta: -1.226 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.226 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 77 
## Fisher Information: 0.37 
## Item parametrləri: a = 2.43 , b = -2.21 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1, 0, 1, 0, 1 
## EAP theta: -1.208 
## Posterior SE: 0.293 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.293 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.293 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0, 0, 1, 0, 1, 0, 1 
## EAP theta: -1.208 
## Posterior SE: 0.293 
## 
## İrəliləyiş: 4 % ( 1 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 0 
## EAP theta: -0.343 
## Posterior SE: 0.72 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.72 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.343 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 38 
## Fisher Information: 0.901 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 0 
## EAP theta: -0.753 
## Posterior SE: 0.654 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.654 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.753 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.798 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 0, 0, 1 
## EAP theta: -0.488 
## Posterior SE: 0.557 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.557 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.488 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 44 
## Fisher Information: 0.701 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 0, 0, 1, 1 
## EAP theta: -0.331 
## Posterior SE: 0.509 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.509 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.509 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.331 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 70 
## Fisher Information: 0.809 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 0, 0, 1, 1, 0 
## EAP theta: -0.51 
## Posterior SE: 0.481 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.481 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.481 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.51 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 57 
## Fisher Information: 0.665 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 0, 0, 1, 1, 0, 1 
## EAP theta: -0.374 
## Posterior SE: 0.437 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.437 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.437 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.374 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 67 
## Fisher Information: 0.655 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -0.499 
## Posterior SE: 0.423 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.423 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.423 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.499 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 41 
## Fisher Information: 0.56 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.437 
## Posterior SE: 0.386 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.386 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.386 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.437 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 50 
## Fisher Information: 0.542 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: -0.376 
## Posterior SE: 0.363 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.376 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 28 
## Fisher Information: 0.499 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: -0.324 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.324 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 3 
## Fisher Information: 0.506 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0 
## EAP theta: -0.395 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.334 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.395 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 59 
## Fisher Information: 0.484 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0 
## EAP theta: -0.484 
## Posterior SE: 0.335 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.335 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.335 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.484 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 23 
## Fisher Information: 0.532 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0, 1 
## EAP theta: -0.452 
## Posterior SE: 0.319 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.319 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.319 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.452 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 87 
## Fisher Information: 0.502 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0, 1, 1 
## EAP theta: -0.422 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.422 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 56 
## Fisher Information: 0.454 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: -0.38 
## Posterior SE: 0.3 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.3 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.3 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 0, 1, 1, 0, 1, 0, 1, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: -0.38 
## Posterior SE: 0.3 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 1 
## EAP theta: 1.21 
## Posterior SE: 0.662 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.662 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.21 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 63 
## Fisher Information: 0.809 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 1, 0 
## EAP theta: 0.936 
## Posterior SE: 0.541 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.541 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.541 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.936 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.811 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 1, 0, 0 
## EAP theta: 0.654 
## Posterior SE: 0.494 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.494 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.494 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.654 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 51 
## Fisher Information: 0.888 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 1, 0, 0, 1 
## EAP theta: 0.764 
## Posterior SE: 0.447 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.447 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.447 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.764 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 98 
## Fisher Information: 0.668 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1 
## EAP theta: 0.905 
## Posterior SE: 0.427 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.427 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.427 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.905 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 27 
## Fisher Information: 0.711 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: 1.025 
## Posterior SE: 0.407 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.407 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.407 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.025 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 13 
## Fisher Information: 0.623 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0 
## EAP theta: 0.831 
## Posterior SE: 0.387 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.387 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.387 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.831 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 39 
## Fisher Information: 0.611 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1 
## EAP theta: 0.907 
## Posterior SE: 0.369 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.369 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.369 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.907 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 96 
## Fisher Information: 0.536 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.782 
## Posterior SE: 0.361 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.361 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.361 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.782 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 89 
## Fisher Information: 0.55 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0 
## EAP theta: 0.581 
## Posterior SE: 0.364 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.364 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.364 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.581 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 55 
## Fisher Information: 0.65 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1 
## EAP theta: 0.639 
## Posterior SE: 0.342 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.342 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.342 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.639 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 3 
## Fisher Information: 0.582 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0 
## EAP theta: 0.468 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.468 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 70 
## Fisher Information: 0.746 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1 
## EAP theta: 0.517 
## Posterior SE: 0.325 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.325 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.325 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.517 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 67 
## Fisher Information: 0.673 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0 
## EAP theta: 0.333 
## Posterior SE: 0.331 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.331 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.331 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.333 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 38 
## Fisher Information: 0.564 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1 
## EAP theta: 0.368 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.368 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 57 
## Fisher Information: 0.48 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.398 
## Posterior SE: 0.302 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.302 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.302 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.398 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 21 
## Fisher Information: 0.453 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.438 
## Posterior SE: 0.293 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.293 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.293 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 1, 0, 0, 1, 1, 1, 0, 1, 0, 0, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.438 
## Posterior SE: 0.293 
## 
## İrəliləyiş: 12 % ( 3 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 0 
## EAP theta: 0.553 
## Posterior SE: 0.582 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.582 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.553 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 0, 1 
## EAP theta: 0.708 
## Posterior SE: 0.526 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.526 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.526 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.708 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.741 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 0, 1, 1 
## EAP theta: 0.86 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.86 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.724 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 1.029 
## Posterior SE: 0.49 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.49 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.49 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.029 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 27 
## Fisher Information: 0.74 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1 
## EAP theta: 1.171 
## Posterior SE: 0.472 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.472 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.472 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.171 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 63 
## Fisher Information: 0.76 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 1.023 
## Posterior SE: 0.416 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.416 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.416 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.023 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 13 
## Fisher Information: 0.624 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.094 
## Posterior SE: 0.4 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.4 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.4 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.094 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 39 
## Fisher Information: 0.555 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.159 
## Posterior SE: 0.386 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.386 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.386 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.159 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 64 
## Fisher Information: 0.585 
## Item parametrləri: a = 2.09 , b = 1.58 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 1.073 
## Posterior SE: 0.362 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.362 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.362 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.073 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 8 
## Fisher Information: 0.534 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0 
## EAP theta: 0.966 
## Posterior SE: 0.351 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.351 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.351 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.966 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 88 
## Fisher Information: 0.533 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0 
## EAP theta: 0.86 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.86 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 96 
## Fisher Information: 0.541 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0 
## EAP theta: 0.753 
## Posterior SE: 0.342 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.342 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.342 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.753 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 89 
## Fisher Information: 0.568 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1 
## EAP theta: 0.793 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.793 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 55 
## Fisher Information: 0.542 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 1 
## EAP theta: 0.83 
## Posterior SE: 0.314 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.314 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.314 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.83 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 3 
## Fisher Information: 0.466 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 1, 1 
## EAP theta: 0.858 
## Posterior SE: 0.306 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.306 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.306 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.858 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 30 
## Fisher Information: 0.42 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 1, 1, 0 
## EAP theta: 0.806 
## Posterior SE: 0.3 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.3 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.3 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 0, 0, 1, 1, 1, 0 
## EAP theta: 0.806 
## Posterior SE: 0.3 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.184 
## Posterior SE: 0.742 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.742 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.184 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 70 
## Fisher Information: 0.941 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 1 
## EAP theta: 0.109 
## Posterior SE: 0.654 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.654 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.109 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 67 
## Fisher Information: 0.931 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 1, 1 
## EAP theta: 0.299 
## Posterior SE: 0.585 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.585 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.299 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 0.997 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 1, 1, 0 
## EAP theta: 0.003 
## Posterior SE: 0.53 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.53 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.53 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.003 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 38 
## Fisher Information: 0.826 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 1, 1, 0, 1 
## EAP theta: 0.123 
## Posterior SE: 0.464 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.464 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.464 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.123 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 3 
## Fisher Information: 0.733 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 1, 1, 0, 1, 1 
## EAP theta: 0.237 
## Posterior SE: 0.431 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.431 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.431 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.237 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 4 
## Fisher Information: 0.782 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 0.363 
## Posterior SE: 0.414 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.414 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.414 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.363 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 89 
## Fisher Information: 0.741 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1 
## EAP theta: 0.446 
## Posterior SE: 0.397 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.397 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.397 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.446 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 55 
## Fisher Information: 0.696 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 0.521 
## Posterior SE: 0.383 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.383 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.383 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.521 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 31 
## Fisher Information: 0.709 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.635 
## Posterior SE: 0.382 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.382 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.382 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.635 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 37 
## Fisher Information: 0.693 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 0.517 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.517 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 13 
## Fisher Information: 0.585 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0 
## EAP theta: 0.421 
## Posterior SE: 0.33 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.33 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.33 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.421 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 39 
## Fisher Information: 0.537 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.347 
## Posterior SE: 0.321 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.347 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 57 
## Fisher Information: 0.493 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.379 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.379 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 96 
## Fisher Information: 0.481 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 0 
## EAP theta: 0.319 
## Posterior SE: 0.303 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.303 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.303 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.319 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 21 
## Fisher Information: 0.461 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 0, 1 
## EAP theta: 0.363 
## Posterior SE: 0.295 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.295 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.295 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 0, 1 
## EAP theta: 0.363 
## Posterior SE: 0.295 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 0 
## EAP theta: 0.202 
## Posterior SE: 0.625 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.625 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.202 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 70 
## Fisher Information: 0.962 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 0, 1 
## EAP theta: 0.381 
## Posterior SE: 0.55 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.55 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.381 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 1.009 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 0, 1, 0 
## EAP theta: 0.089 
## Posterior SE: 0.499 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.499 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.499 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.089 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 67 
## Fisher Information: 0.934 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 0, 1, 0, 1 
## EAP theta: 0.214 
## Posterior SE: 0.448 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.448 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.448 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.214 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 89 
## Fisher Information: 0.739 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.318 
## Posterior SE: 0.42 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.42 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.42 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.318 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 3 
## Fisher Information: 0.724 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.402 
## Posterior SE: 0.396 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.396 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.396 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.402 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 55 
## Fisher Information: 0.706 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0 
## EAP theta: 0.235 
## Posterior SE: 0.376 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.376 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.376 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.235 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 38 
## Fisher Information: 0.647 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: 0.285 
## Posterior SE: 0.354 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.354 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.354 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.285 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 57 
## Fisher Information: 0.529 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1 
## EAP theta: 0.327 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.327 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 31 
## Fisher Information: 0.549 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 0.423 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.423 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 39 
## Fisher Information: 0.538 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: 0.343 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.343 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 13 
## Fisher Information: 0.487 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0 
## EAP theta: 0.274 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.274 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 44 
## Fisher Information: 0.471 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.114 
## Posterior SE: 0.317 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.317 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.317 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.114 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 1 
## Fisher Information: 0.519 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.147 
## Posterior SE: 0.302 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.302 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.302 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.147 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 21 
## Fisher Information: 0.464 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 0 
## EAP theta: 0.075 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.075 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 100 
## Fisher Information: 0.421 
## Item parametrləri: a = 1.48 , b = 0.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 0, 0 
## EAP theta: 0.016 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.016 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 59 
## Fisher Information: 0.426 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 0, 0, 1 
## EAP theta: 0.051 
## Posterior SE: 0.29 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.29 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.29 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 0, 1, 0, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 0, 0, 1 
## EAP theta: 0.051 
## Posterior SE: 0.29 
## 
## İrəliləyiş: 24 % ( 6 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 0 
## EAP theta: -1.425 
## Posterior SE: 0.62 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.62 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.425 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 20 
## Fisher Information: 0.939 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 0, 1 
## EAP theta: -1.236 
## Posterior SE: 0.561 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.561 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.236 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 91 
## Fisher Information: 0.93 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 0, 1, 1 
## EAP theta: -1.075 
## Posterior SE: 0.51 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.51 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.51 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.075 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 87 
## Fisher Information: 0.838 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 0, 1, 1, 1 
## EAP theta: -0.937 
## Posterior SE: 0.469 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.469 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.469 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.937 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 41 
## Fisher Information: 0.782 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 0, 1, 1, 1, 0 
## EAP theta: -1.167 
## Posterior SE: 0.446 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.446 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.446 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.167 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 61 
## Fisher Information: 0.846 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1 
## EAP theta: -1.062 
## Posterior SE: 0.406 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.406 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.406 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.062 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 52 
## Fisher Information: 0.791 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1 
## EAP theta: -0.982 
## Posterior SE: 0.383 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.383 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.383 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.982 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 1 
## Fisher Information: 0.675 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: -1.074 
## Posterior SE: 0.364 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.364 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.364 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.074 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 92 
## Fisher Information: 0.651 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0 
## EAP theta: -1.26 
## Posterior SE: 0.36 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.36 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.36 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.26 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 76 
## Fisher Information: 0.625 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1 
## EAP theta: -1.19 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.19 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 28 
## Fisher Information: 0.562 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0 
## EAP theta: -1.265 
## Posterior SE: 0.335 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.335 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.335 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.265 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 97 
## Fisher Information: 0.594 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: -1.222 
## Posterior SE: 0.319 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.319 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.319 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.222 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 94 
## Fisher Information: 0.533 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: -1.182 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.182 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 50 
## Fisher Information: 0.438 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 0 
## EAP theta: -1.239 
## Posterior SE: 0.3 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.3 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.3 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 0 
## EAP theta: -1.239 
## Posterior SE: 0.3 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 0 
## EAP theta: 0.553 
## Posterior SE: 0.582 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.582 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.553 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 0, 1 
## EAP theta: 0.708 
## Posterior SE: 0.526 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.526 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.526 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.708 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.741 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 0, 1, 1 
## EAP theta: 0.86 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.86 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.724 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 0.675 
## Posterior SE: 0.461 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.461 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.461 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.675 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 13 
## Fisher Information: 0.643 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1 
## EAP theta: 0.783 
## Posterior SE: 0.438 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.438 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.438 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.783 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 27 
## Fisher Information: 0.66 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1 
## EAP theta: 0.915 
## Posterior SE: 0.419 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.419 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.419 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.915 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 39 
## Fisher Information: 0.601 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1 
## EAP theta: 0.998 
## Posterior SE: 0.403 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.403 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.403 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.998 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 63 
## Fisher Information: 0.535 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1 
## EAP theta: 1.138 
## Posterior SE: 0.409 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.409 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.409 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.138 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 64 
## Fisher Information: 0.567 
## Item parametrləri: a = 2.09 , b = 1.58 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 1.044 
## Posterior SE: 0.383 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.383 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.383 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.044 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 8 
## Fisher Information: 0.533 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.126 
## Posterior SE: 0.37 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.37 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.37 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.126 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 88 
## Fisher Information: 0.517 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.19 
## Posterior SE: 0.359 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.359 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.359 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.19 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 30 
## Fisher Information: 0.499 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 1.265 
## Posterior SE: 0.352 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.352 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.352 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.265 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 78 
## Fisher Information: 0.519 
## Item parametrləri: a = 1.91 , b = 1.39 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: 1.169 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.334 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.169 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 96 
## Fisher Information: 0.481 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0 
## EAP theta: 1.048 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.048 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 82 
## Fisher Information: 0.445 
## Item parametrləri: a = 1.67 , b = 1.06 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.966 
## Posterior SE: 0.318 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.318 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.318 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.966 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 55 
## Fisher Information: 0.442 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.993 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.993 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 89 
## Fisher Information: 0.416 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: 1.017 
## Posterior SE: 0.303 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.303 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.303 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.017 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 35 
## Fisher Information: 0.39 
## Item parametrləri: a = 1.43 , b = 1.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 1, 1 
## EAP theta: 1.07 
## Posterior SE: 0.298 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.298 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.298 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 1, 1, 1, 0, 1, 1, 1, 0, 0, 0, 1, 1, 1 
## EAP theta: 1.07 
## Posterior SE: 0.298 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 0 
## EAP theta: 0.202 
## Posterior SE: 0.625 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.625 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.202 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 70 
## Fisher Information: 0.962 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 0, 0 
## EAP theta: -0.21 
## Posterior SE: 0.591 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.591 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.21 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 38 
## Fisher Information: 0.911 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 0, 0, 1 
## EAP theta: -0.041 
## Posterior SE: 0.512 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.512 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.512 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.041 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 67 
## Fisher Information: 0.918 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 0, 0, 1, 1 
## EAP theta: 0.1 
## Posterior SE: 0.464 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.464 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.464 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.1 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 51 
## Fisher Information: 0.871 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 0, 0, 1, 1, 1 
## EAP theta: 0.243 
## Posterior SE: 0.434 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.434 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.434 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.243 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 89 
## Fisher Information: 0.743 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0 
## EAP theta: 0.062 
## Posterior SE: 0.418 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.418 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.418 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.062 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 3 
## Fisher Information: 0.721 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0 
## EAP theta: -0.089 
## Posterior SE: 0.42 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.42 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.42 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.089 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 57 
## Fisher Information: 0.704 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1 
## EAP theta: -0.005 
## Posterior SE: 0.376 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.376 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.376 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.005 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 55 
## Fisher Information: 0.633 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0 
## EAP theta: -0.108 
## Posterior SE: 0.375 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.375 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.375 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.108 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 44 
## Fisher Information: 0.679 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: -0.046 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.046 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 1 
## Fisher Information: 0.624 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: 0.002 
## Posterior SE: 0.321 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.002 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 21 
## Fisher Information: 0.452 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.06 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.06 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 100 
## Fisher Information: 0.419 
## Item parametrləri: a = 1.48 , b = 0.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 0 
## EAP theta: -0.002 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.002 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 59 
## Fisher Information: 0.43 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: 0.036 
## Posterior SE: 0.297 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.297 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.297 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: 0.036 
## Posterior SE: 0.297 
## 
## İrəliləyiş: 36 % ( 9 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.184 
## Posterior SE: 0.742 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.742 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.184 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 70 
## Fisher Information: 0.941 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 0 
## EAP theta: -0.571 
## Posterior SE: 0.67 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.67 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.571 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.833 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 0, 1 
## EAP theta: -0.321 
## Posterior SE: 0.559 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.559 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.321 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 38 
## Fisher Information: 0.907 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 0, 1, 1 
## EAP theta: -0.154 
## Posterior SE: 0.501 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.501 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.501 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.154 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 67 
## Fisher Information: 0.859 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 0, 1, 1, 1 
## EAP theta: -0.008 
## Posterior SE: 0.466 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.466 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.466 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.008 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 51 
## Fisher Information: 0.759 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 0, 1, 1, 1, 0 
## EAP theta: -0.157 
## Posterior SE: 0.437 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.437 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.437 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.157 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 57 
## Fisher Information: 0.719 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: -0.062 
## Posterior SE: 0.399 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.399 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.399 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.062 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 3 
## Fisher Information: 0.674 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0 
## EAP theta: -0.186 
## Posterior SE: 0.389 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.389 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.389 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.186 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 44 
## Fisher Information: 0.705 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.115 
## Posterior SE: 0.361 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.361 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.361 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.115 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 89 
## Fisher Information: 0.579 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.205 
## Posterior SE: 0.353 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.353 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.353 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.205 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 55 
## Fisher Information: 0.509 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0 
## EAP theta: -0.278 
## Posterior SE: 0.35 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.35 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.35 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.278 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 50 
## Fisher Information: 0.491 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0, 1 
## EAP theta: -0.234 
## Posterior SE: 0.329 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.329 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.329 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.234 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 59 
## Fisher Information: 0.472 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0, 1, 1 
## EAP theta: -0.182 
## Posterior SE: 0.311 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.311 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.311 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.182 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 56 
## Fisher Information: 0.425 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0, 1, 1, 1 
## EAP theta: -0.146 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.146 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 21 
## Fisher Information: 0.425 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0, 1, 1, 1, 1 
## EAP theta: -0.091 
## Posterior SE: 0.293 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.293 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.293 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 0, 1, 1, 1, 0, 1, 0, 1, 0, 0, 1, 1, 1, 1 
## EAP theta: -0.091 
## Posterior SE: 0.293 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 1 
## EAP theta: 1.21 
## Posterior SE: 0.662 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.662 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.21 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 63 
## Fisher Information: 0.809 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 1, 0 
## EAP theta: 0.936 
## Posterior SE: 0.541 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.541 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.541 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.936 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.811 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 1, 0, 1 
## EAP theta: 1.076 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.076 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.793 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.226 
## Posterior SE: 0.478 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.478 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.478 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.226 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 27 
## Fisher Information: 0.731 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 1.002 
## Posterior SE: 0.441 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.441 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.441 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.002 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 13 
## Fisher Information: 0.631 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0 
## EAP theta: 0.782 
## Posterior SE: 0.427 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.427 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.427 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.782 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 51 
## Fisher Information: 0.775 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1 
## EAP theta: 0.856 
## Posterior SE: 0.393 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.393 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.393 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.856 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 39 
## Fisher Information: 0.609 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0 
## EAP theta: 0.707 
## Posterior SE: 0.385 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.385 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.385 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.707 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 89 
## Fisher Information: 0.597 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: 0.76 
## Posterior SE: 0.363 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.76 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 55 
## Fisher Information: 0.561 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: 0.807 
## Posterior SE: 0.347 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.347 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.347 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.807 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 96 
## Fisher Information: 0.544 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.872 
## Posterior SE: 0.335 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.335 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.335 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.872 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 88 
## Fisher Information: 0.533 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: 0.936 
## Posterior SE: 0.327 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.327 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.327 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.936 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 8 
## Fisher Information: 0.521 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 0.856 
## Posterior SE: 0.316 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.316 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.316 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.856 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 3 
## Fisher Information: 0.45 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.883 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.883 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 30 
## Fisher Information: 0.428 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.829 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.829 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 70 
## Fisher Information: 0.417 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.849 
## Posterior SE: 0.294 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.294 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.294 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.849 
## Posterior SE: 0.294 
## 
## İrəliləyiş: 44 % ( 11 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 0 
## EAP theta: -0.343 
## Posterior SE: 0.72 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.72 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.343 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 38 
## Fisher Information: 0.901 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 0 
## EAP theta: -0.753 
## Posterior SE: 0.654 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.654 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.753 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.798 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 0, 0, 0 
## EAP theta: -1.048 
## Posterior SE: 0.628 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.628 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.048 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 23 
## Fisher Information: 1.01 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 0, 0, 0, 1 
## EAP theta: -0.851 
## Posterior SE: 0.543 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.543 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.543 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.851 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 87 
## Fisher Information: 0.772 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 0, 0, 0, 1, 1 
## EAP theta: -0.72 
## Posterior SE: 0.484 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.484 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.484 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.72 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 41 
## Fisher Information: 0.697 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 0, 0, 0, 1, 1, 0 
## EAP theta: -1.009 
## Posterior SE: 0.482 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.482 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.482 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.009 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 91 
## Fisher Information: 0.847 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1 
## EAP theta: -0.904 
## Posterior SE: 0.435 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.435 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.435 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 52 
## Fisher Information: 0.702 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -1.163 
## Posterior SE: 0.438 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.438 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.438 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.163 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 61 
## Fisher Information: 0.844 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -1.061 
## Posterior SE: 0.393 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.393 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.393 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.061 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 20 
## Fisher Information: 0.75 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -1.302 
## Posterior SE: 0.395 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.395 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.395 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.302 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 92 
## Fisher Information: 0.748 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -1.226 
## Posterior SE: 0.366 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.366 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.366 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.226 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 76 
## Fisher Information: 0.624 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0 
## EAP theta: -1.354 
## Posterior SE: 0.367 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.367 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.367 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.354 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 97 
## Fisher Information: 0.645 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -1.296 
## Posterior SE: 0.342 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.342 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.342 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.296 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 94 
## Fisher Information: 0.563 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0 
## EAP theta: -1.437 
## Posterior SE: 0.349 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.349 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.349 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.437 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 77 
## Fisher Information: 0.549 
## Item parametrləri: a = 2.43 , b = -2.21 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -1.399 
## Posterior SE: 0.328 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.328 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.328 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.399 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 28 
## Fisher Information: 0.482 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: -1.315 
## Posterior SE: 0.315 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.315 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.315 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.315 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 50 
## Fisher Information: 0.369 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: -1.367 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.367 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 42 
## Fisher Information: 0.324 
## Item parametrləri: a = 1.53 , b = -1.03 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0 
## EAP theta: -1.419 
## Posterior SE: 0.308 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.308 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.308 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.419 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 16 
## Fisher Information: 0.315 
## Item parametrləri: a = 1.59 , b = -2.2 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0 
## EAP theta: -1.532 
## Posterior SE: 0.318 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.318 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.318 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.532 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 79 
## Fisher Information: 0.303 
## Item parametrləri: a = 1.67 , b = -2.55 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1 
## EAP theta: -1.508 
## Posterior SE: 0.308 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.308 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.308 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.508 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 62 
## Fisher Information: 0.301 
## Item parametrləri: a = 1.24 , b = -1.59 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: -1.466 
## Posterior SE: 0.298 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.298 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.298 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 0, 0, 0, 1, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: -1.466 
## Posterior SE: 0.298 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 1 
## EAP theta: -0.699 
## Posterior SE: 0.598 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.598 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.699 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.815 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 1, 1 
## EAP theta: -0.473 
## Posterior SE: 0.531 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.531 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.473 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 38 
## Fisher Information: 0.84 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 1, 1, 1 
## EAP theta: -0.304 
## Posterior SE: 0.497 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.497 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.497 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.304 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 70 
## Fisher Information: 0.836 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 1, 1, 1, 1 
## EAP theta: -0.132 
## Posterior SE: 0.47 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.47 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.47 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.132 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 67 
## Fisher Information: 0.874 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 1, 1, 1, 1, 1 
## EAP theta: 0.001 
## Posterior SE: 0.447 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.447 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.447 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.001 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 51 
## Fisher Information: 0.769 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.145 
## Posterior SE: 0.434 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.434 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.434 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.145 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 3 
## Fisher Information: 0.736 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.032 
## Posterior SE: 0.408 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.408 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.408 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.032 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 57 
## Fisher Information: 0.686 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.045 
## Posterior SE: 0.383 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.383 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.383 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.045 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 89 
## Fisher Information: 0.68 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: -0.076 
## Posterior SE: 0.366 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.366 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.366 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.076 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 44 
## Fisher Information: 0.666 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.019 
## Posterior SE: 0.346 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.346 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.346 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.019 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 55 
## Fisher Information: 0.626 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.109 
## Posterior SE: 0.336 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.336 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.336 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.109 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 59 
## Fisher Information: 0.452 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -0.06 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.06 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 4 
## Fisher Information: 0.496 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.021 
## Posterior SE: 0.318 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.318 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.318 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.021 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 21 
## Fisher Information: 0.454 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: -0.051 
## Posterior SE: 0.315 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.315 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.315 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.051 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 100 
## Fisher Information: 0.402 
## Item parametrləri: a = 1.48 , b = 0.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0 
## EAP theta: -0.11 
## Posterior SE: 0.314 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.314 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.314 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.11 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 50 
## Fisher Information: 0.424 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0 
## EAP theta: -0.249 
## Posterior SE: 0.324 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.324 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.324 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.249 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 28 
## Fisher Information: 0.449 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1 
## EAP theta: -0.212 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.212 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 56 
## Fisher Information: 0.431 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: -0.176 
## Posterior SE: 0.299 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.299 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.299 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 0, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: -0.176 
## Posterior SE: 0.299 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 1 
## EAP theta: 1.21 
## Posterior SE: 0.662 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.662 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.21 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 63 
## Fisher Information: 0.809 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 1, 1 
## EAP theta: 1.509 
## Posterior SE: 0.652 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.652 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.652 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.509 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 64 
## Fisher Information: 0.806 
## Item parametrləri: a = 2.09 , b = 1.58 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 1, 1, 0 
## EAP theta: 1.205 
## Posterior SE: 0.559 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.559 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.559 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.205 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.79 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.367 
## Posterior SE: 0.515 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.515 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.515 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.367 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 27 
## Fisher Information: 0.687 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.486 
## Posterior SE: 0.482 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.482 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.482 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.486 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 25 
## Fisher Information: 0.591 
## Item parametrləri: a = 1.9 , b = 1.68 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 1.634 
## Posterior SE: 0.47 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.47 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.47 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.634 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 81 
## Fisher Information: 0.619 
## Item parametrləri: a = 2.28 , b = 1.97 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: 1.491 
## Posterior SE: 0.425 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.425 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.425 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.491 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 78 
## Fisher Information: 0.568 
## Item parametrləri: a = 1.91 , b = 1.39 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1 
## EAP theta: 1.577 
## Posterior SE: 0.41 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.41 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.41 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.577 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 71 
## Fisher Information: 0.565 
## Item parametrləri: a = 1.97 , b = 1.85 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0 
## EAP theta: 1.467 
## Posterior SE: 0.389 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.389 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.389 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.467 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 37 
## Fisher Information: 0.553 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 1.514 
## Posterior SE: 0.371 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.371 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.371 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.514 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 30 
## Fisher Information: 0.498 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: 1.579 
## Posterior SE: 0.359 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.359 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.359 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.579 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 8 
## Fisher Information: 0.452 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 1.626 
## Posterior SE: 0.349 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.349 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.349 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.626 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 72 
## Fisher Information: 0.447 
## Item parametrləri: a = 1.66 , b = 1.59 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: 1.684 
## Posterior SE: 0.343 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.343 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.343 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.684 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 82 
## Fisher Information: 0.39 
## Item parametrləri: a = 1.67 , b = 1.06 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 1.721 
## Posterior SE: 0.337 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.337 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.337 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.721 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 43 
## Fisher Information: 0.392 
## Item parametrləri: a = 2.38 , b = 2.26 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.802 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.802 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 2 
## Fisher Information: 0.452 
## Item parametrləri: a = 2.29 , b = 2.34 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.896 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.896 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 18 
## Fisher Information: 0.375 
## Item parametrləri: a = 1.48 , b = 1.91 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.955 
## Posterior SE: 0.344 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.344 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.344 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.955 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 9 
## Fisher Information: 0.372 
## Item parametrləri: a = 2.04 , b = 2.57 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 1.901 
## Posterior SE: 0.33 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.33 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.33 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.901 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 36 
## Fisher Information: 0.358 
## Item parametrləri: a = 1.41 , b = 2.24 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.969 
## Posterior SE: 0.326 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.326 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.326 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.969 
## Administered items sayı: 22 
## Available items sayı: 78 
## Seçilmiş item: 74 
## Fisher Information: 0.324 
## Item parametrləri: a = 1.37 , b = 1.84 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 2.013 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 2.013 
## Administered items sayı: 23 
## Available items sayı: 77 
## Seçilmiş item: 35 
## Fisher Information: 0.309 
## Item parametrləri: a = 1.43 , b = 1.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 2.042 
## Posterior SE: 0.317 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.317 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.317 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 2.042 
## Administered items sayı: 24 
## Available items sayı: 76 
## Seçilmiş item: 69 
## Fisher Information: 0.307 
## Item parametrləri: a = 1.82 , b = 2.62 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1 
## EAP theta: 2.104 
## Posterior SE: 0.319 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.319 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.319 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 2.104 
## Administered items sayı: 25 
## Available items sayı: 75 
## Seçilmiş item: 24 
## Fisher Information: 0.328 
## Item parametrləri: a = 2 , b = 2.8 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 2.062 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 2.062 
## Administered items sayı: 26 
## Available items sayı: 74 
## Seçilmiş item: 17 
## Fisher Information: 0.258 
## Item parametrləri: a = 1.46 , b = 1.07 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 2.083 
## Posterior SE: 0.305 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.305 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.305 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 2.083 
## Administered items sayı: 27 
## Available items sayı: 73 
## Seçilmiş item: 26 
## Fisher Information: 0.243 
## Item parametrləri: a = 1.46 , b = 1.13 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 1.979 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.979 
## Administered items sayı: 28 
## Available items sayı: 72 
## Seçilmiş item: 88 
## Fisher Information: 0.256 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 1.996 
## Posterior SE: 0.297 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.297 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.297 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 1, 1, 1, 1, 1, 0, 1, 1, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 1.996 
## Posterior SE: 0.297 
## 
## İrəliləyiş: 56 % ( 14 / 25 ) - Qalan vaxt:  0.1  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.184 
## Posterior SE: 0.742 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.742 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.184 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 70 
## Fisher Information: 0.941 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 0 
## EAP theta: -0.571 
## Posterior SE: 0.67 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.67 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.571 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.833 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 0, 0 
## EAP theta: -0.929 
## Posterior SE: 0.655 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.655 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.929 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 23 
## Fisher Information: 0.945 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 0, 0, 1 
## EAP theta: -0.735 
## Posterior SE: 0.562 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.562 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.562 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.735 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 41 
## Fisher Information: 0.705 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 0, 0, 1, 1 
## EAP theta: -0.603 
## Posterior SE: 0.499 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.499 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.499 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.603 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 38 
## Fisher Information: 0.737 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 0, 0, 1, 1, 1 
## EAP theta: -0.443 
## Posterior SE: 0.467 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.467 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.467 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.443 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 44 
## Fisher Information: 0.713 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1 
## EAP theta: -0.327 
## Posterior SE: 0.435 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.435 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.435 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.327 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 57 
## Fisher Information: 0.721 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1 
## EAP theta: -0.22 
## Posterior SE: 0.407 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.407 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.407 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.22 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 67 
## Fisher Information: 0.808 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: -0.11 
## Posterior SE: 0.391 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.391 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.391 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.11 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 3 
## Fisher Information: 0.649 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.226 
## Posterior SE: 0.374 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.374 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.374 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.226 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 51 
## Fisher Information: 0.501 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0 
## EAP theta: -0.3 
## Posterior SE: 0.361 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.361 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.361 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.3 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 50 
## Fisher Information: 0.5 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0 
## EAP theta: -0.464 
## Posterior SE: 0.375 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.375 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.375 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.464 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 28 
## Fisher Information: 0.531 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0 
## EAP theta: -0.623 
## Posterior SE: 0.397 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.397 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.397 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.623 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 87 
## Fisher Information: 0.627 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1 
## EAP theta: -0.563 
## Posterior SE: 0.363 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.563 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 91 
## Fisher Information: 0.479 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1 
## EAP theta: -0.527 
## Posterior SE: 0.342 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.342 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.342 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.527 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 59 
## Fisher Information: 0.481 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1 
## EAP theta: -0.459 
## Posterior SE: 0.325 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.325 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.325 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.459 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 56 
## Fisher Information: 0.455 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1 
## EAP theta: -0.411 
## Posterior SE: 0.314 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.314 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.314 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.411 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 5 
## Fisher Information: 0.417 
## Item parametrləri: a = 1.58 , b = -0.81 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1 
## EAP theta: -0.372 
## Posterior SE: 0.304 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.372 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 55 
## Fisher Information: 0.391 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.418 
## Posterior SE: 0.298 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.298 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.298 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 1, 0, 0, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.418 
## Posterior SE: 0.298 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 0 
## EAP theta: -0.343 
## Posterior SE: 0.72 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.72 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.343 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 38 
## Fisher Information: 0.901 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 1 
## EAP theta: -0.092 
## Posterior SE: 0.638 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.638 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.092 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 70 
## Fisher Information: 0.993 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 0, 1, 1 
## EAP theta: 0.132 
## Posterior SE: 0.57 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.57 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.132 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 67 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 0, 1, 1, 1 
## EAP theta: 0.284 
## Posterior SE: 0.523 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.523 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.523 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.284 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 51 
## Fisher Information: 0.992 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 0, 1, 1, 1, 1 
## EAP theta: 0.444 
## Posterior SE: 0.494 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.494 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.494 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.444 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 4 
## Fisher Information: 0.897 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 0.587 
## Posterior SE: 0.475 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.475 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.475 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.587 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 31 
## Fisher Information: 0.754 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.745 
## Posterior SE: 0.467 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.467 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.467 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.745 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 37 
## Fisher Information: 0.761 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 0.558 
## Posterior SE: 0.41 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.41 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.41 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.558 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 89 
## Fisher Information: 0.678 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.627 
## Posterior SE: 0.393 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.393 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.393 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.627 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 55 
## Fisher Information: 0.63 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.435 
## Posterior SE: 0.37 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.37 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.37 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.435 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 3 
## Fisher Information: 0.686 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.496 
## Posterior SE: 0.354 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.354 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.354 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.496 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 13 
## Fisher Information: 0.575 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.57 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.57 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 39 
## Fisher Information: 0.587 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: 0.475 
## Posterior SE: 0.333 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.333 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.333 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.475 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 96 
## Fisher Information: 0.508 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1 
## EAP theta: 0.548 
## Posterior SE: 0.325 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.325 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.325 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.548 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 27 
## Fisher Information: 0.514 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: 0.488 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.488 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 98 
## Fisher Information: 0.461 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 0 
## EAP theta: 0.439 
## Posterior SE: 0.304 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.439 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 21 
## Fisher Information: 0.447 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 0, 1 
## EAP theta: 0.479 
## Posterior SE: 0.296 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.296 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.296 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 0, 1, 1, 1, 1, 1, 1, 0, 1, 0, 1, 1, 0, 1, 0, 0, 1 
## EAP theta: 0.479 
## Posterior SE: 0.296 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.184 
## Posterior SE: 0.742 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.742 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.184 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 70 
## Fisher Information: 0.941 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 1 
## EAP theta: 0.109 
## Posterior SE: 0.654 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.654 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.109 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 67 
## Fisher Information: 0.931 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 1, 1 
## EAP theta: 0.299 
## Posterior SE: 0.585 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.585 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.299 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 0.997 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 1, 1, 1 
## EAP theta: 0.485 
## Posterior SE: 0.539 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.539 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.539 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.485 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 4 
## Fisher Information: 0.906 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 1, 1, 1, 1 
## EAP theta: 0.643 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.643 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 31 
## Fisher Information: 0.787 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.814 
## Posterior SE: 0.494 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.494 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.494 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.814 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 37 
## Fisher Information: 0.79 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.945 
## Posterior SE: 0.484 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.484 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.484 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.945 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 98 
## Fisher Information: 0.762 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.095 
## Posterior SE: 0.474 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.474 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.474 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.095 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 27 
## Fisher Information: 0.744 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.224 
## Posterior SE: 0.463 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.463 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.463 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.224 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 63 
## Fisher Information: 0.827 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 1.071 
## Posterior SE: 0.402 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.402 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.402 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.071 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 13 
## Fisher Information: 0.607 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0 
## EAP theta: 0.876 
## Posterior SE: 0.376 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.376 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.376 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.876 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 39 
## Fisher Information: 0.607 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.736 
## Posterior SE: 0.363 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.736 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 89 
## Fisher Information: 0.579 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.781 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.781 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 55 
## Fisher Information: 0.549 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1 
## EAP theta: 0.823 
## Posterior SE: 0.336 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.336 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.336 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.823 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 96 
## Fisher Information: 0.544 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1 
## EAP theta: 0.883 
## Posterior SE: 0.327 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.327 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.327 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.883 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 88 
## Fisher Information: 0.534 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1 
## EAP theta: 0.944 
## Posterior SE: 0.321 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.944 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 8 
## Fisher Information: 0.522 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1, 0 
## EAP theta: 0.867 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.867 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 3 
## Fisher Information: 0.444 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.892 
## Posterior SE: 0.303 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.303 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.303 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.892 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 30 
## Fisher Information: 0.431 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.839 
## Posterior SE: 0.295 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.295 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.295 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 0.839 
## Posterior SE: 0.295 
## 
## İrəliləyiş: 68 % ( 17 / 25 ) - Qalan vaxt:  0  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 0 
## EAP theta: -1.425 
## Posterior SE: 0.62 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.62 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.425 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 20 
## Fisher Information: 0.939 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 0, 1 
## EAP theta: -1.236 
## Posterior SE: 0.561 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.561 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.236 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 91 
## Fisher Information: 0.93 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 0, 1, 1 
## EAP theta: -1.075 
## Posterior SE: 0.51 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.51 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.51 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.075 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 87 
## Fisher Information: 0.838 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 0, 1, 1, 0 
## EAP theta: -1.329 
## Posterior SE: 0.483 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.483 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.483 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.329 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 61 
## Fisher Information: 0.897 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 0, 1, 1, 0, 1 
## EAP theta: -1.19 
## Posterior SE: 0.432 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.432 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.432 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.19 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 52 
## Fisher Information: 0.832 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -1.393 
## Posterior SE: 0.418 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.418 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.418 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.393 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 92 
## Fisher Information: 0.762 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0 
## EAP theta: -1.578 
## Posterior SE: 0.417 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.417 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.417 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.578 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 97 
## Fisher Information: 0.743 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1 
## EAP theta: -1.487 
## Posterior SE: 0.378 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.378 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.378 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.487 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 94 
## Fisher Information: 0.625 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1 
## EAP theta: -1.416 
## Posterior SE: 0.352 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.352 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.352 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.416 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 41 
## Fisher Information: 0.646 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0 
## EAP theta: -1.503 
## Posterior SE: 0.343 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.343 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.343 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.503 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 77 
## Fisher Information: 0.614 
## Item parametrləri: a = 2.43 , b = -2.21 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 1 
## EAP theta: -1.464 
## Posterior SE: 0.324 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.324 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.324 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.464 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 76 
## Fisher Information: 0.599 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 1, 1 
## EAP theta: -1.398 
## Posterior SE: 0.312 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.312 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.312 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.398 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 28 
## Fisher Information: 0.483 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 1, 1, 1 
## EAP theta: -1.32 
## Posterior SE: 0.304 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.32 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 1 
## Fisher Information: 0.419 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: -1.358 
## Posterior SE: 0.297 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.297 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.297 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 1, 1, 0, 1, 0, 0, 1, 1, 0, 1, 1, 1, 0 
## EAP theta: -1.358 
## Posterior SE: 0.297 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 0 
## EAP theta: -1.425 
## Posterior SE: 0.62 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.62 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.425 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 20 
## Fisher Information: 0.939 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 0, 0 
## EAP theta: -1.795 
## Posterior SE: 0.561 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.561 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.795 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 77 
## Fisher Information: 0.91 
## Item parametrləri: a = 2.43 , b = -2.21 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 0, 0, 1 
## EAP theta: -1.65 
## Posterior SE: 0.5 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.5 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.5 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.65 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 61 
## Fisher Information: 0.819 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 0, 0, 1, 1 
## EAP theta: -1.469 
## Posterior SE: 0.462 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.462 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.462 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.469 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 91 
## Fisher Information: 0.853 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 0, 0, 1, 1, 0 
## EAP theta: -1.65 
## Posterior SE: 0.43 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.43 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.43 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.65 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 97 
## Fisher Information: 0.76 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0 
## EAP theta: -1.841 
## Posterior SE: 0.424 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.424 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.424 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.841 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 94 
## Fisher Information: 0.639 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1 
## EAP theta: -1.728 
## Posterior SE: 0.391 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.391 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.391 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.728 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 92 
## Fisher Information: 0.659 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1 
## EAP theta: -1.633 
## Posterior SE: 0.374 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.374 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.374 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.633 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 52 
## Fisher Information: 0.685 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0 
## EAP theta: -1.734 
## Posterior SE: 0.362 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.362 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.362 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.734 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 76 
## Fisher Information: 0.494 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0 
## EAP theta: -1.811 
## Posterior SE: 0.358 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.358 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.358 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.811 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 79 
## Fisher Information: 0.399 
## Item parametrləri: a = 1.67 , b = -2.55 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1 
## EAP theta: -1.77 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.77 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 87 
## Fisher Information: 0.415 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1 
## EAP theta: -1.684 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.334 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.684 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 41 
## Fisher Information: 0.433 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0 
## EAP theta: -1.74 
## Posterior SE: 0.328 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.328 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.328 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.74 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 16 
## Fisher Information: 0.381 
## Item parametrləri: a = 1.59 , b = -2.2 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1 
## EAP theta: -1.702 
## Posterior SE: 0.316 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.316 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.316 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.702 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 28 
## Fisher Information: 0.339 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0 
## EAP theta: -1.739 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.739 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 10 
## Fisher Information: 0.313 
## Item parametrləri: a = 2.48 , b = -2.82 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -1.722 
## Posterior SE: 0.304 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.304 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.304 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.722 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 62 
## Fisher Information: 0.291 
## Item parametrləri: a = 1.24 , b = -1.59 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: -1.772 
## Posterior SE: 0.305 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.305 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.305 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.772 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 54 
## Fisher Information: 0.216 
## Item parametrləri: a = 1.16 , b = -1.59 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0 
## EAP theta: -1.819 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.819 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 86 
## Fisher Information: 0.198 
## Item parametrləri: a = 1.32 , b = -1.26 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0 
## EAP theta: -1.858 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.858 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 12 
## Fisher Information: 0.19 
## Item parametrləri: a = 1.06 , b = -1.61 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0 
## EAP theta: -1.9 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.9 
## Administered items sayı: 22 
## Available items sayı: 78 
## Seçilmiş item: 45 
## Fisher Information: 0.182 
## Item parametrləri: a = 1.24 , b = -1.18 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0 
## EAP theta: -1.933 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.933 
## Administered items sayı: 23 
## Available items sayı: 77 
## Seçilmiş item: 80 
## Fisher Information: 0.168 
## Item parametrləri: a = 1.06 , b = -1.44 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0 
## EAP theta: -1.97 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.97 
## Administered items sayı: 24 
## Available items sayı: 76 
## Seçilmiş item: 42 
## Fisher Information: 0.154 
## Item parametrləri: a = 1.53 , b = -1.03 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0 
## EAP theta: -1.997 
## Posterior SE: 0.312 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.312 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.312 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.997 
## Administered items sayı: 25 
## Available items sayı: 75 
## Seçilmiş item: 22 
## Fisher Information: 0.124 
## Item parametrləri: a = 1.36 , b = -0.94 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1 
## EAP theta: -1.954 
## Posterior SE: 0.307 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.307 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.307 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.954 
## Administered items sayı: 26 
## Available items sayı: 74 
## Seçilmiş item: 5 
## Fisher Information: 0.114 
## Item parametrləri: a = 1.58 , b = -0.81 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1 
## EAP theta: -1.908 
## Posterior SE: 0.303 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.303 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.303 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.908 
## Administered items sayı: 27 
## Available items sayı: 73 
## Seçilmiş item: 15 
## Fisher Information: 0.119 
## Item parametrləri: a = 1.47 , b = -0.7 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0 
## EAP theta: -1.927 
## Posterior SE: 0.303 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.303 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.303 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.927 
## Administered items sayı: 28 
## Available items sayı: 72 
## Seçilmiş item: 50 
## Fisher Information: 0.106 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0 
## EAP theta: -1.947 
## Posterior SE: 0.302 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.302 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.302 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.947 
## Administered items sayı: 29 
## Available items sayı: 71 
## Seçilmiş item: 59 
## Fisher Information: 0.102 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0 
## EAP theta: -1.961 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 0, 0, 0, 1, 1, 0, 0, 1, 1, 0, 0, 1, 1, 0, 1, 0, 1, 0, 0, 0, 0, 0, 0, 0, 1, 1, 0, 0, 0 
## EAP theta: -1.961 
## Posterior SE: 0.301 
## 
## İrəliləyiş: 76 % ( 19 / 25 ) - Qalan vaxt:  0  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 0 
## EAP theta: -0.904 
## Posterior SE: 0.687 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.687 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.904 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 23 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 0, 1 
## EAP theta: -0.699 
## Posterior SE: 0.598 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.598 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.699 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.815 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 0, 1, 1 
## EAP theta: -0.473 
## Posterior SE: 0.531 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.531 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.473 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 38 
## Fisher Information: 0.84 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 0, 1, 1, 1 
## EAP theta: -0.304 
## Posterior SE: 0.497 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.497 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.497 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.304 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 70 
## Fisher Information: 0.836 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 0, 1, 1, 1, 0 
## EAP theta: -0.484 
## Posterior SE: 0.459 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.459 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.459 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.484 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 44 
## Fisher Information: 0.702 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 0, 1, 1, 1, 0, 0 
## EAP theta: -0.663 
## Posterior SE: 0.448 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.448 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.448 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.663 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 41 
## Fisher Information: 0.664 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1 
## EAP theta: -0.581 
## Posterior SE: 0.408 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.408 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.408 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.581 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 57 
## Fisher Information: 0.629 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0 
## EAP theta: -0.698 
## Posterior SE: 0.399 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.399 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.399 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.698 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 87 
## Fisher Information: 0.68 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: -0.634 
## Posterior SE: 0.369 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.369 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.369 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.634 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 28 
## Fisher Information: 0.58 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: -0.566 
## Posterior SE: 0.348 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.348 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.348 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.566 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 50 
## Fisher Information: 0.569 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1 
## EAP theta: -0.51 
## Posterior SE: 0.335 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.335 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.335 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.51 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 67 
## Fisher Information: 0.505 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: -0.429 
## Posterior SE: 0.333 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.333 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.333 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.429 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 59 
## Fisher Information: 0.484 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: -0.368 
## Posterior SE: 0.321 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.321 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.321 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.368 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 3 
## Fisher Information: 0.473 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1, 0 
## EAP theta: -0.428 
## Posterior SE: 0.311 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.311 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.311 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.428 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 56 
## Fisher Information: 0.454 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1, 0, 0 
## EAP theta: -0.516 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.516 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 91 
## Fisher Information: 0.442 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1, 0, 0, 1 
## EAP theta: -0.493 
## Posterior SE: 0.3 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.3 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.3 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 0, 1, 1, 1, 0, 0, 1, 0, 1, 1, 1, 1, 1, 0, 0, 1 
## EAP theta: -0.493 
## Posterior SE: 0.3 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 0 
## EAP theta: 0.553 
## Posterior SE: 0.582 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.582 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.553 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 51 
## Fisher Information: 0.957 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 0, 1 
## EAP theta: 0.708 
## Posterior SE: 0.526 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.526 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.526 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.708 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.741 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 0, 1, 1 
## EAP theta: 0.86 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.86 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.724 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 0.675 
## Posterior SE: 0.461 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.461 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.461 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.675 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 13 
## Fisher Information: 0.643 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1 
## EAP theta: 0.783 
## Posterior SE: 0.438 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.438 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.438 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.783 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 27 
## Fisher Information: 0.66 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: 0.651 
## Posterior SE: 0.416 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.416 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.416 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.651 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 89 
## Fisher Information: 0.63 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: 0.716 
## Posterior SE: 0.389 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.389 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.389 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.716 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 39 
## Fisher Information: 0.611 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0 
## EAP theta: 0.584 
## Posterior SE: 0.379 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.379 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.379 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.584 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 55 
## Fisher Information: 0.649 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: 0.646 
## Posterior SE: 0.357 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.357 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.357 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.646 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 3 
## Fisher Information: 0.578 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: 0.692 
## Posterior SE: 0.341 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.341 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.341 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.692 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 96 
## Fisher Information: 0.543 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: 0.759 
## Posterior SE: 0.331 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.331 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.331 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.759 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 88 
## Fisher Information: 0.523 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: 0.826 
## Posterior SE: 0.324 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.324 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.324 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.826 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 8 
## Fisher Information: 0.5 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 0.894 
## Posterior SE: 0.32 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.32 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.32 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.894 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 30 
## Fisher Information: 0.432 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 0.963 
## Posterior SE: 0.318 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.318 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.318 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.963 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 63 
## Fisher Information: 0.492 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.055 
## Posterior SE: 0.325 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.325 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.325 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.055 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 64 
## Fisher Information: 0.499 
## Item parametrləri: a = 2.09 , b = 1.58 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.148 
## Posterior SE: 0.327 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.327 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.327 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.148 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 78 
## Fisher Information: 0.471 
## Item parametrləri: a = 1.91 , b = 1.39 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 1.074 
## Posterior SE: 0.312 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.312 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.312 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.074 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 82 
## Fisher Information: 0.448 
## Item parametrləri: a = 1.67 , b = 1.06 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.122 
## Posterior SE: 0.308 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.308 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.308 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.122 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 35 
## Fisher Information: 0.401 
## Item parametrləri: a = 1.43 , b = 1.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 1.06 
## Posterior SE: 0.301 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.301 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.301 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.06 
## Administered items sayı: 22 
## Available items sayı: 78 
## Seçilmiş item: 17 
## Fisher Information: 0.37 
## Item parametrləri: a = 1.46 , b = 1.07 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0 
## EAP theta: 0.997 
## Posterior SE: 0.295 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.295 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.295 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 1, 1, 1, 0, 1, 1, 0, 1, 0, 1, 0, 1, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0 
## EAP theta: 0.997 
## Posterior SE: 0.295 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 0, 1 
## EAP theta: -0.184 
## Posterior SE: 0.742 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.742 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.184 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 70 
## Fisher Information: 0.941 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 0, 1, 0 
## EAP theta: -0.571 
## Posterior SE: 0.67 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.67 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.571 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 1 
## Fisher Information: 0.833 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 0, 1, 0, 0 
## EAP theta: -0.929 
## Posterior SE: 0.655 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.655 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.929 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 23 
## Fisher Information: 0.945 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 0, 1, 0, 0, 0 
## EAP theta: -1.415 
## Posterior SE: 0.618 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.618 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.618 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.415 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 20 
## Fisher Information: 0.939 
## Item parametrləri: a = 2.42 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 0, 1, 0, 0, 0, 0 
## EAP theta: -1.789 
## Posterior SE: 0.565 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.565 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.565 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.789 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 77 
## Fisher Information: 0.904 
## Item parametrləri: a = 2.43 , b = -2.21 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 0, 1, 0, 0, 0, 0, 1 
## EAP theta: -1.643 
## Posterior SE: 0.503 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.503 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.503 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.643 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 61 
## Fisher Information: 0.823 
## Item parametrləri: a = 2.15 , b = -1.48 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0 
## EAP theta: -1.828 
## Posterior SE: 0.472 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.472 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.472 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -1.828 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 97 
## Fisher Information: 0.763 
## Item parametrləri: a = 2.02 , b = -1.86 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0 
## EAP theta: -2.02 
## Posterior SE: 0.456 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.456 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.456 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.02 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 94 
## Fisher Information: 0.588 
## Item parametrləri: a = 1.82 , b = -1.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0 
## EAP theta: -2.153 
## Posterior SE: 0.448 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.448 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.448 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.153 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 10 
## Fisher Information: 0.689 
## Item parametrləri: a = 2.48 , b = -2.82 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1 
## EAP theta: -2.078 
## Posterior SE: 0.408 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.408 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.408 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.078 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 79 
## Fisher Information: 0.479 
## Item parametrləri: a = 1.67 , b = -2.55 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1 
## EAP theta: -2.011 
## Posterior SE: 0.386 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.386 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.386 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.011 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 92 
## Fisher Information: 0.444 
## Item parametrləri: a = 2.17 , b = -1.55 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0 
## EAP theta: -2.093 
## Posterior SE: 0.372 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.372 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.372 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.093 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 16 
## Fisher Information: 0.401 
## Item parametrləri: a = 1.59 , b = -2.2 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0 
## EAP theta: -2.203 
## Posterior SE: 0.371 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.371 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.371 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.203 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 76 
## Fisher Information: 0.244 
## Item parametrləri: a = 1.85 , b = -1.39 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0 
## EAP theta: -2.248 
## Posterior SE: 0.365 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.365 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.365 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.248 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 62 
## Fisher Information: 0.223 
## Item parametrləri: a = 1.24 , b = -1.59 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0 
## EAP theta: -2.297 
## Posterior SE: 0.365 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.365 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.365 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.297 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 52 
## Fisher Information: 0.168 
## Item parametrləri: a = 2.21 , b = -1.39 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0 
## EAP theta: -2.333 
## Posterior SE: 0.359 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.359 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.359 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.333 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 54 
## Fisher Information: 0.155 
## Item parametrləri: a = 1.16 , b = -1.59 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0 
## EAP theta: -2.375 
## Posterior SE: 0.361 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.361 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.361 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.375 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 12 
## Fisher Information: 0.146 
## Item parametrləri: a = 1.06 , b = -1.61 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0 
## EAP theta: -2.416 
## Posterior SE: 0.363 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.363 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.363 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.416 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 80 
## Fisher Information: 0.121 
## Item parametrləri: a = 1.06 , b = -1.44 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0 
## EAP theta: -2.451 
## Posterior SE: 0.365 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.365 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.365 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.451 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 45 
## Fisher Information: 0.096 
## Item parametrləri: a = 1.24 , b = -1.18 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0 
## EAP theta: -2.479 
## Posterior SE: 0.365 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.365 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.365 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.479 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 86 
## Fisher Information: 0.087 
## Item parametrləri: a = 1.32 , b = -1.26 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1 
## EAP theta: -2.429 
## Posterior SE: 0.36 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.36 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.36 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.429 
## Administered items sayı: 22 
## Available items sayı: 78 
## Seçilmiş item: 28 
## Fisher Information: 0.082 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0 
## EAP theta: -2.446 
## Posterior SE: 0.358 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.358 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.358 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.446 
## Administered items sayı: 23 
## Available items sayı: 77 
## Seçilmiş item: 84 
## Fisher Information: 0.079 
## Item parametrləri: a = 0.83 , b = -1.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1 
## EAP theta: -2.407 
## Posterior SE: 0.351 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.351 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.351 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.407 
## Administered items sayı: 24 
## Available items sayı: 76 
## Seçilmiş item: 91 
## Fisher Information: 0.089 
## Item parametrləri: a = 2.38 , b = -1.37 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0 
## EAP theta: -2.432 
## Posterior SE: 0.347 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.347 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.347 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.432 
## Administered items sayı: 25 
## Available items sayı: 75 
## Seçilmiş item: 49 
## Fisher Information: 0.07 
## Item parametrləri: a = 0.89 , b = -0.72 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 26 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1 
## EAP theta: -2.381 
## Posterior SE: 0.338 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 26 
## Current SE: 0.338 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.338 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.381 
## Administered items sayı: 26 
## Available items sayı: 74 
## Seçilmiş item: 87 
## Fisher Information: 0.073 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 27 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: -2.329 
## Posterior SE: 0.339 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 27 
## Current SE: 0.339 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.339 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.329 
## Administered items sayı: 27 
## Available items sayı: 73 
## Seçilmiş item: 41 
## Fisher Information: 0.079 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 28 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: -2.348 
## Posterior SE: 0.337 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 28 
## Current SE: 0.337 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.337 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.348 
## Administered items sayı: 28 
## Available items sayı: 72 
## Seçilmiş item: 42 
## Fisher Information: 0.076 
## Item parametrləri: a = 1.53 , b = -1.03 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 29 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 0, 1 
## EAP theta: -2.303 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 29 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.334 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -2.303 
## Administered items sayı: 29 
## Available items sayı: 71 
## Seçilmiş item: 22 
## Fisher Information: 0.076 
## Item parametrləri: a = 1.36 , b = -0.94 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: -2.323 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 30 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Maksimum item sayına çatıldı: 30 / 30 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 30 
## Responses: 0, 1, 0, 0, 0, 0, 1, 0, 0, 0, 1, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: -2.323 
## Posterior SE: 0.334 
## 
## İrəliləyiş: 88 % ( 22 / 25 ) - Qalan vaxt:  0  dəqiqə
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 0 
## EAP theta: -0.343 
## Posterior SE: 0.72 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.72 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.343 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 38 
## Fisher Information: 0.901 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 1 
## EAP theta: -0.092 
## Posterior SE: 0.638 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.638 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.092 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 70 
## Fisher Information: 0.993 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 0, 1, 0 
## EAP theta: -0.422 
## Posterior SE: 0.588 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.588 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.422 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 1 
## Fisher Information: 0.813 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 0, 1, 0, 1 
## EAP theta: -0.24 
## Posterior SE: 0.496 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.496 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.496 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.24 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 67 
## Fisher Information: 0.79 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 0, 1, 0, 1, 0 
## EAP theta: -0.425 
## Posterior SE: 0.471 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.471 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.471 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.425 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 44 
## Fisher Information: 0.717 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -0.31 
## Posterior SE: 0.428 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.428 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.428 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.31 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 57 
## Fisher Information: 0.723 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0 
## EAP theta: -0.477 
## Posterior SE: 0.43 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.43 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.43 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.477 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 50 
## Fisher Information: 0.552 
## Item parametrləri: a = 1.86 , b = -0.83 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1 
## EAP theta: -0.4 
## Posterior SE: 0.393 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.393 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.393 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.4 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 28 
## Fisher Information: 0.508 
## Item parametrləri: a = 1.72 , b = -0.97 , c = 0.1 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1 
## EAP theta: -0.338 
## Posterior SE: 0.365 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.365 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.365 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.338 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 3 
## Fisher Information: 0.495 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0 
## EAP theta: -0.415 
## Posterior SE: 0.356 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.356 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.356 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.415 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 41 
## Fisher Information: 0.503 
## Item parametrləri: a = 2.13 , b = -1.16 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1 
## EAP theta: -0.375 
## Posterior SE: 0.337 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.337 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.337 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.375 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 59 
## Fisher Information: 0.483 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0 
## EAP theta: -0.467 
## Posterior SE: 0.338 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.338 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.338 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.467 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 23 
## Fisher Information: 0.517 
## Item parametrləri: a = 2.44 , b = -1.26 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1 
## EAP theta: -0.435 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.435 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 87 
## Fisher Information: 0.489 
## Item parametrləri: a = 2.2 , b = -1.21 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1 
## EAP theta: -0.405 
## Posterior SE: 0.31 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.31 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.31 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.405 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 56 
## Fisher Information: 0.453 
## Item parametrləri: a = 1.65 , b = -0.64 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1 
## EAP theta: -0.363 
## Posterior SE: 0.302 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.302 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.302 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.363 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 5 
## Fisher Information: 0.41 
## Item parametrləri: a = 1.58 , b = -0.81 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: -0.328 
## Posterior SE: 0.295 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.295 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.295 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 0, 1, 0, 1, 0, 1, 0, 1, 1, 0, 1, 0, 1, 1, 1, 1 
## EAP theta: -0.328 
## Posterior SE: 0.295 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 0 
## EAP theta: -0.343 
## Posterior SE: 0.72 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.72 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.343 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 38 
## Fisher Information: 0.901 
## Item parametrləri: a = 2.34 , b = -0.37 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 0, 1 
## EAP theta: -0.092 
## Posterior SE: 0.638 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.638 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: -0.092 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 70 
## Fisher Information: 0.993 
## Item parametrləri: a = 2.41 , b = -0.08 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 0, 1, 1 
## EAP theta: 0.132 
## Posterior SE: 0.57 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.57 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.132 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 67 
## Fisher Information: 0.927 
## Item parametrləri: a = 2.41 , b = -0.06 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 0, 1, 1, 1 
## EAP theta: 0.284 
## Posterior SE: 0.523 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.523 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.523 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.284 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 51 
## Fisher Information: 0.992 
## Item parametrləri: a = 2.44 , b = 0.27 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 0, 1, 1, 1, 1 
## EAP theta: 0.444 
## Posterior SE: 0.494 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.494 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.494 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.444 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 4 
## Fisher Information: 0.897 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 0, 1, 1, 1, 1, 0 
## EAP theta: 0.224 
## Posterior SE: 0.44 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.44 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.44 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.224 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 89 
## Fisher Information: 0.741 
## Item parametrləri: a = 2.17 , b = 0.16 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1 
## EAP theta: 0.324 
## Posterior SE: 0.414 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.414 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.414 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.324 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 3 
## Fisher Information: 0.722 
## Item parametrləri: a = 2.09 , b = 0.06 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 0.406 
## Posterior SE: 0.393 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.393 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.393 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.406 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 55 
## Fisher Information: 0.705 
## Item parametrləri: a = 2.05 , b = 0.17 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0 
## EAP theta: 0.241 
## Posterior SE: 0.372 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.372 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.372 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.241 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 57 
## Fisher Information: 0.554 
## Item parametrləri: a = 2.04 , b = -0.37 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0 
## EAP theta: 0.045 
## Posterior SE: 0.38 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.38 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.38 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.045 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 44 
## Fisher Information: 0.606 
## Item parametrləri: a = 2.11 , b = -0.47 , c = 0.23 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1 
## EAP theta: 0.1 
## Posterior SE: 0.352 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.352 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.352 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.1 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 1 
## Fisher Information: 0.528 
## Item parametrləri: a = 2.03 , b = -0.65 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1 
## EAP theta: 0.142 
## Posterior SE: 0.333 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.333 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.333 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.142 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 21 
## Fisher Information: 0.464 
## Item parametrləri: a = 1.57 , b = 0.07 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1 
## EAP theta: 0.2 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.2 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 31 
## Fisher Information: 0.439 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1 
## EAP theta: 0.287 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.287 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 39 
## Fisher Information: 0.475 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0 
## EAP theta: 0.224 
## Posterior SE: 0.312 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.312 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.312 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.224 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 100 
## Fisher Information: 0.432 
## Item parametrləri: a = 1.48 , b = 0.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0, 0 
## EAP theta: 0.153 
## Posterior SE: 0.309 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.309 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.309 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.153 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 96 
## Fisher Information: 0.397 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0, 0, 0 
## EAP theta: 0.107 
## Posterior SE: 0.305 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.305 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.305 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.107 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 59 
## Fisher Information: 0.403 
## Item parametrləri: a = 1.54 , b = -0.54 , c = 0.11 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.14 
## Posterior SE: 0.295 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.295 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.295 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 0, 1, 1, 1, 1, 0, 1, 1, 0, 0, 1, 1, 1, 1, 0, 0, 0, 1 
## EAP theta: 0.14 
## Posterior SE: 0.295 
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0 
## Administered items sayı: 1 
## Available items sayı: 99 
## Seçilmiş item: 65 
## Fisher Information: 1.136 
## Item parametrləri: a = 2.47 , b = -0.1 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 2 
## Responses: 1, 1 
## EAP theta: 0.735 
## Posterior SE: 0.771 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 2 
## Current SE: 0.771 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 2 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.735 
## Administered items sayı: 2 
## Available items sayı: 98 
## Seçilmiş item: 4 
## Fisher Information: 0.856 
## Item parametrləri: a = 2.31 , b = 0.42 , c = 0.2 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 3 
## Responses: 1, 1, 1 
## EAP theta: 0.973 
## Posterior SE: 0.708 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 3 
## Current SE: 0.708 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 3 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.973 
## Administered items sayı: 3 
## Available items sayı: 97 
## Seçilmiş item: 31 
## Fisher Information: 0.841 
## Item parametrləri: a = 2.15 , b = 0.77 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 4 
## Responses: 1, 1, 1, 1 
## EAP theta: 1.21 
## Posterior SE: 0.662 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 4 
## Current SE: 0.662 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Minimum item sayına çatılmayıb: 4 / 5 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.21 
## Administered items sayı: 4 
## Available items sayı: 96 
## Seçilmiş item: 63 
## Fisher Information: 0.809 
## Item parametrləri: a = 2.48 , b = 1.51 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 5 
## Responses: 1, 1, 1, 1, 0 
## EAP theta: 0.936 
## Posterior SE: 0.541 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 5 
## Current SE: 0.541 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.541 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 0.936 
## Administered items sayı: 5 
## Available items sayı: 95 
## Seçilmiş item: 37 
## Fisher Information: 0.811 
## Item parametrləri: a = 2.28 , b = 0.81 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 6 
## Responses: 1, 1, 1, 1, 0, 1 
## EAP theta: 1.076 
## Posterior SE: 0.508 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 6 
## Current SE: 0.508 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.508 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.076 
## Administered items sayı: 6 
## Available items sayı: 94 
## Seçilmiş item: 98 
## Fisher Information: 0.793 
## Item parametrləri: a = 2.07 , b = 1.02 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 7 
## Responses: 1, 1, 1, 1, 0, 1, 1 
## EAP theta: 1.226 
## Posterior SE: 0.478 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 7 
## Current SE: 0.478 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.478 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.226 
## Administered items sayı: 7 
## Available items sayı: 93 
## Seçilmiş item: 27 
## Fisher Information: 0.731 
## Item parametrləri: a = 1.99 , b = 0.99 , c = 0.15 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 8 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1 
## EAP theta: 1.343 
## Posterior SE: 0.453 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 8 
## Current SE: 0.453 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.453 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.343 
## Administered items sayı: 8 
## Available items sayı: 92 
## Seçilmiş item: 64 
## Fisher Information: 0.721 
## Item parametrləri: a = 2.09 , b = 1.58 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 9 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1 
## EAP theta: 1.499 
## Posterior SE: 0.444 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 9 
## Current SE: 0.444 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.444 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.499 
## Administered items sayı: 9 
## Available items sayı: 91 
## Seçilmiş item: 25 
## Fisher Information: 0.596 
## Item parametrləri: a = 1.9 , b = 1.68 , c = 0.16 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 10 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1 
## EAP theta: 1.627 
## Posterior SE: 0.438 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 10 
## Current SE: 0.438 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.438 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.627 
## Administered items sayı: 10 
## Available items sayı: 90 
## Seçilmiş item: 81 
## Fisher Information: 0.612 
## Item parametrləri: a = 2.28 , b = 1.97 , c = 0.21 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 11 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.764 
## Posterior SE: 0.441 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 11 
## Current SE: 0.441 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.441 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.764 
## Administered items sayı: 11 
## Available items sayı: 89 
## Seçilmiş item: 71 
## Fisher Information: 0.651 
## Item parametrləri: a = 1.97 , b = 1.85 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 12 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1 
## EAP theta: 1.883 
## Posterior SE: 0.432 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 12 
## Current SE: 0.432 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.432 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.883 
## Administered items sayı: 12 
## Available items sayı: 88 
## Seçilmiş item: 43 
## Fisher Information: 0.558 
## Item parametrləri: a = 2.38 , b = 2.26 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 13 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0 
## EAP theta: 1.765 
## Posterior SE: 0.392 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 13 
## Current SE: 0.392 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.392 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.765 
## Administered items sayı: 13 
## Available items sayı: 87 
## Seçilmiş item: 78 
## Fisher Information: 0.543 
## Item parametrləri: a = 1.91 , b = 1.39 , c = 0.25 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 14 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1 
## EAP theta: 1.825 
## Posterior SE: 0.38 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 14 
## Current SE: 0.38 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.38 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.825 
## Administered items sayı: 14 
## Available items sayı: 86 
## Seçilmiş item: 2 
## Fisher Information: 0.475 
## Item parametrləri: a = 2.29 , b = 2.34 , c = 0.19 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 15 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0 
## EAP theta: 1.748 
## Posterior SE: 0.358 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 15 
## Current SE: 0.358 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.358 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.748 
## Administered items sayı: 15 
## Available items sayı: 85 
## Seçilmiş item: 72 
## Fisher Information: 0.453 
## Item parametrləri: a = 1.66 , b = 1.59 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 16 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0 
## EAP theta: 1.638 
## Posterior SE: 0.349 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 16 
## Current SE: 0.349 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.349 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.638 
## Administered items sayı: 16 
## Available items sayı: 84 
## Seçilmiş item: 30 
## Fisher Information: 0.478 
## Item parametrləri: a = 1.62 , b = 1.23 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 17 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0 
## EAP theta: 1.516 
## Posterior SE: 0.346 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 17 
## Current SE: 0.346 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.346 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.516 
## Administered items sayı: 17 
## Available items sayı: 83 
## Seçilmiş item: 8 
## Fisher Information: 0.471 
## Item parametrləri: a = 1.67 , b = 0.99 , c = 0.14 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 18 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1 
## EAP theta: 1.563 
## Posterior SE: 0.334 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 18 
## Current SE: 0.334 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.334 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.563 
## Administered items sayı: 18 
## Available items sayı: 82 
## Seçilmiş item: 82 
## Fisher Information: 0.419 
## Item parametrləri: a = 1.67 , b = 1.06 , c = 0.22 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 19 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1 
## EAP theta: 1.602 
## Posterior SE: 0.325 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 19 
## Current SE: 0.325 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.325 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.602 
## Administered items sayı: 19 
## Available items sayı: 81 
## Seçilmiş item: 35 
## Fisher Information: 0.386 
## Item parametrləri: a = 1.43 , b = 1.17 , c = 0.12 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 20 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0 
## EAP theta: 1.509 
## Posterior SE: 0.322 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 20 
## Current SE: 0.322 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.322 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.509 
## Administered items sayı: 20 
## Available items sayı: 80 
## Seçilmiş item: 88 
## Fisher Information: 0.415 
## Item parametrləri: a = 1.65 , b = 0.8 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 21 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0 
## EAP theta: 1.385 
## Posterior SE: 0.323 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 21 
## Current SE: 0.323 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.323 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.385 
## Administered items sayı: 21 
## Available items sayı: 79 
## Seçilmiş item: 13 
## Fisher Information: 0.456 
## Item parametrləri: a = 2.05 , b = 0.66 , c = 0.24 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 22 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1 
## EAP theta: 1.415 
## Posterior SE: 0.313 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 22 
## Current SE: 0.313 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.313 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.415 
## Administered items sayı: 22 
## Available items sayı: 78 
## Seçilmiş item: 39 
## Fisher Information: 0.424 
## Item parametrləri: a = 1.85 , b = 0.64 , c = 0.17 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 23 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1, 0 
## EAP theta: 1.276 
## Posterior SE: 0.315 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 23 
## Current SE: 0.315 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.315 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.276 
## Administered items sayı: 23 
## Available items sayı: 77 
## Seçilmiş item: 96 
## Fisher Information: 0.447 
## Item parametrləri: a = 1.67 , b = 0.65 , c = 0.13 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 24 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1, 0, 1 
## EAP theta: 1.312 
## Posterior SE: 0.305 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 24 
## Current SE: 0.305 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: DAVAM ( Davam edir: SE = 0.305 > threshold = 0.3 )
## 
## === ITEM SEÇİMİ ALGORİTMİ ===
## Current theta: 1.312 
## Administered items sayı: 24 
## Available items sayı: 76 
## Seçilmiş item: 17 
## Fisher Information: 0.376 
## Item parametrləri: a = 1.46 , b = 1.07 , c = 0.18 
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: 1.351 
## Posterior SE: 0.299 
## 
## === SONLANDIRMA KRİTERİYALARI YOXLAMASI ===
## Current step: 25 
## Current SE: 0.299 
## Min items: 5 , Max items: 30 , SE threshold: 0.3 
## Qərar: SONLANDIR ( Tələb olunan dəqiqliyə çatıldı: SE = 0.299 ≤ 0.3 )
## 
## === QABİLİYYƏT QİYMƏTLƏNDİRMƏ (EAP) ===
## Administered items: 25 
## Responses: 1, 1, 1, 1, 0, 1, 1, 1, 1, 1, 1, 1, 0, 1, 0, 0, 0, 1, 1, 0, 0, 1, 0, 1, 1 
## EAP theta: 1.351 
## Posterior SE: 0.299 
## 
## İrəliləyiş: 100 % ( 25 / 25 ) - Qalan vaxt:  0  dəqiqə
## 
## Simulyasiya tamamlandı!
## Toplam vaxt: 0.13 dəqiqə
## Test alıcısı başına orta vaxt: 0.317 saniyə
# Nəticələrin təhlili
medium_summary <- extract_simulation_summary(medium_simulation$results)

cat("=== ORTA ÖLÇÜLݘ SİMULYASİYA NƏTİCƏLƏRİ ===\n")
## === ORTA ÖLÇÜLݘ SİMULYASİYA NƏTİCƏLƏRİ ===
cat("Test alıcı sayı:", nrow(medium_summary), "\n")
## Test alıcı sayı: 25
cat("Orta test uzunluğu:", round(mean(medium_summary$Items_Count), 1), 
    "± ", round(sd(medium_summary$Items_Count), 1), "\n")
## Orta test uzunluğu: 20.2 ±  4.3
cat("Orta final SE:", round(mean(medium_summary$Final_SE), 3), 
    "± ", round(sd(medium_summary$Final_SE), 3), "\n")
## Orta final SE: 0.298 ±  0.008
cat("Orta qiymətləndirmə xətası:", round(mean(medium_summary$Estimation_Error), 3), "\n")
## Orta qiymətləndirmə xətası: 0.248
cat("RMSE:", round(sqrt(mean(medium_summary$Estimation_Error^2)), 3), "\n")
## RMSE: 0.301
cat("Orta bias:", round(mean(medium_summary$Bias), 3), "\n")
## Orta bias: 0.017
# SE threshold-a çatan test alıcıları
converged_examinees <- sum(medium_summary$Final_SE <= 0.3)
convergence_rate <- round(100 * converged_examinees / nrow(medium_summary), 1)

cat("SE ≤ 0.3-a çatan test alıcıları:", converged_examinees, "/", nrow(medium_summary), 
    "(", convergence_rate, "%)\n")
## SE ≤ 0.3-a çatan test alıcıları: 23 / 25 ( 92 %)
# Efficiency metriklər
efficiency_analysis <- function(summary_data) {
    
    cat("\n=== EFFEKTİVLİK TƏHLİLİ ===\n")
    
    # Test effektivliyi (1 / (SE × Items))
    summary_data$Efficiency <- 1 / (summary_data$Final_SE * summary_data$Items_Count)
    
    # Qabiliyyət səviyyəsinə görə qruplaşdırma
    summary_data$Ability_Group <- cut(summary_data$True_Theta, 
                                     breaks = c(-Inf, -1, 0, 1, Inf),
                                     labels = c("Aşağı", "Orta-Aşağı", "Orta-Yuxarı", "Yuxarı"))
    
    # Qrup statistikaları
    group_stats <- summary_data %>%
        group_by(Ability_Group) %>%
        summarise(
            Count = n(),
            Mean_Items = round(mean(Items_Count), 1),
            Mean_SE = round(mean(Final_SE), 3),
            Mean_Error = round(mean(Estimation_Error), 3),
            Mean_Efficiency = round(mean(Efficiency), 2),
            .groups = 'drop'
        )
    
    cat("Qabiliyyət qruplarına görə statistikalar:\n")
    print(group_stats)
    
    return(summary_data)
}

medium_summary_enhanced <- efficiency_analysis(medium_summary)
## 
## === EFFEKTİVLİK TƏHLİLİ ===
## Qabiliyyət qruplarına görə statistikalar:
## # A tibble: 4 × 6
##   Ability_Group Count Mean_Items Mean_SE Mean_Error Mean_Efficiency
##   <fct>         <int>      <dbl>   <dbl>      <dbl>           <dbl>
## 1 Aşağı             5       22.2   0.305      0.26             0.16
## 2 Orta-Aşağı        7       18.6   0.297      0.251            0.18
## 3 Orta-Yuxarı      10       19     0.295      0.238            0.18
## 4 Yuxarı            3       24.3   0.298      0.254            0.14
# Son qrafiklərin yaradılması
final_visualization <- function(summary_data) {
    
    # Qabiliyyət qruplarına görə effektivlik
    p1 <- ggplot(summary_data, aes(x = Ability_Group, y = Efficiency, fill = Ability_Group)) +
        geom_boxplot(alpha = 0.7) +
        labs(title = "Qabiliyyət Qruplarına Görə Test Effektivliyi",
             x = "Qabiliyyət Qrupu", y = "Effektivlik (1/SE×Items)",
             fill = "Qrup") +
        theme_minimal() +
        scale_fill_viridis_d()
    
    # Item count vs SE scatter
    p2 <- ggplot(summary_data, aes(x = Items_Count, y = Final_SE, color = Ability_Group)) +
        geom_point(size = 2, alpha = 0.7) +
        geom_hline(yintercept = 0.3, linetype = "dashed", color = "red") +
        labs(title = "Test Uzunluğu vs Final SE",
             x = "Test Uzunluğu", y = "Final SE",
             color = "Qabiliyyət Qrupu") +
        theme_minimal() +
        scale_color_viridis_d()
    
    # Accuracy distribution
    p3 <- ggplot(summary_data, aes(x = Accuracy, fill = Ability_Group)) +
        geom_histogram(alpha = 0.7, bins = 15, position = "identity") +
        facet_wrap(~Ability_Group, scales = "free_y") +
        labs(title = "Doğru Cavab Nisbəti Paylanması",
             x = "Doğru Cavab Nisbəti", y = "Tezlik",
             fill = "Qrup") +
        theme_minimal() +
        scale_fill_viridis_d()
    
    # Error vs True Theta with trend
    p4 <- ggplot(summary_data, aes(x = True_Theta, y = Estimation_Error)) +
        geom_point(alpha = 0.6, size = 2, color = "blue") +
        geom_smooth(method = "loess", se = TRUE, color = "red") +
        labs(title = "Həqiqi Qabiliyyət vs Qiymətləndirmə Xətası",
             x = "Həqiqi θ", y = "Mütləq Qiymətləndirmə Xətası") +
        theme_minimal()
    
    grid.arrange(p1, p2, p3, p4, ncol = 2)
}

# Final vizuallaşdırma
final_visualization(medium_summary_enhanced)

6 Nəticə və Xülasə

Bu bölmədə tam CAT simulyasiya sistemini uğurla qurduq və test etdik. Simulyasiya komponentləri harmonik şəkildə işləyir və real CAT tətbiqlərinə yaxın nəticələr verir.

6.1 Əsas Nəticələr

6.1.1 1. Simulyasiya Performansı

  • Dəqiqlik: Qiymətləndirmə xətaları məqbul həddlər daxilindədir

  • Effektivlik: Test uzunluqları optimum səviyyədədir

  • Konvergens: SE threshold-larına çatma dərəcəsi yüksəkdir

  • Robustness: Müxtəlif qabiliyyət səviyyələrində stabil işləyir

6.1.2 2. Sistem Komponentləri

  • Item Selection: Fisher Information meyarı effektiv işləyir

  • Ability Estimation: EAP metodu dəqiq nəticələr verir

  • Termination: Kriteriyalar məqsədəuyğun sonlandırma təmin edir

  • Integration: Bütün komponentlər problemsiz əlaqəlidir

6.1.3 3. Praktiki Dəyər

  • Araşdırma: CAT algoritmalarının empirik tədqiqi

  • Development: Yeni strategiyaların test edilməsi

  • Validation: Real CAT sistemlərinin keyfiyyət nəzarəti

  • Optimization: Parametrlərin fine-tuning prosesi

6.2 Praktiki Tövsiyələr

6.2.1 İmplementasiya Strategiyası

  1. Pilot Testing: Kiçik nümunə ilə sistem validasiyası
  2. Parameter Tuning: Kontekst-specific optimizasiya
  3. Performance Monitoring: Real-time keyfiyyət nəzarəti
  4. Iterative Improvement: Davamlı təkmilləşdirmə

6.2.2 Keyfiyyət Təminatı

  • Regular Validation: Simulyasiya nəticələrinin yoxlanması

  • Cross-validation: Müxtəlif şəraitlərdə test

  • Benchmark Comparison: Standart metodlarla müqayisə

  • Stakeholder Feedback: İstifadəçi rəyləri əsasında təkmilləşdirmə

6.3 Növbəti Addımlar

Bu tam CAT simulyasiya sistemi gələcək inkişaf üçün möhkəm əsas yaradır:

  • Bölmə 15: Advanced Item Selection Strategies

  • Bölmə 16: Multi-dimensional CAT Implementation

  • Bölmə 17: CAT Security və Exposure Control

  • Bölmə 18: Real-world CAT System Deployment


Qeyd: Bu simulyasiya sistemi həm akademik tədqiqatlar həm də əməli CAT tətbiqləri üçün güclü alətdir. Sistem modullar şəklində qurulub və asanlıqla genişləndirilə və ya dəyişdirilə bilər.