A statistical test provides a mechanism for making quantitative decisions about a process or processes. The intent is to determine whether there is enough evidence to “reject” a conjecture or hypothesis about the process. The conjecture is called the null hypothesis. Not rejecting may be a good result if we want to continue to act as if we “believe” the null hypothesis is true. Or it may be a disappointing result, possibly indicating we may not yet have enough data to “prove” something by rejecting the null hypothesis.
This test is used for testing significance difference between two means (n>30) When the variance are known. It is used for comparing sample mean with population mean, two sample means, sample proportion with population proportion and two sample proportions.
Note: - If the SD of the populations is known a Z-test can be applied even if the sample is smaller than 30
A one-sample t-test is used to test whether a population mean is significantly different from some hypothesized value.
Large values of t-will lead to rejection of the null hypothesis when H0 is true.
A two sample t-test is used to compare the means of two independent populations denote µ1 & µ2) OR A two-sample t-test is used to test the difference (d0) between two population means. Greater the difference between the mean the evidence against the H0 is untrue.
A paired t-test is used when we are interested in the difference between two variables for the same subject. Often the two variables are separated by time.
The null hypothesis is that the mean difference between paired observations is zero. When the mean difference is zero, the means of the two groups must also be equal. Because of the paired design of the data, the null hypothesis of a paired t–test is usually expressed in terms of the mean difference.
One-Way ANOVA is used to simultaneously compare two or more group means based on independent samples from each group. The bigger the variation among sample group means relative to the variation of individual measurements within the groups. The greater the evidence that the hypothesis of equal group means is untrue. It is the extension of t-test. MSG is an estimate of the variability among groups and MSE is an estimate of the variability within groups. Uses of one way ANOVA method might be appropriate for comparing mean responses among a number of parallel dose groups or among various strata based on patients.
Because Si2 is the estimated variance within Group i, s2 represents an average Within - group variation over all groups. In ANOVA, s2 is called the mean square Error (MSE) and its numerator is the sum of squares for error (SSE). The ‘error’ is The deviation of each observation from its group mean. If SSE is expressed as the Sum of squared errors,
then the pooled variance s2 is just SSE/ (N–k). The denominator N–k, where N = n1 + n2 +…+ nk, is the total sample size over all samples and is known as the Degrees of freedom associated with the error.
The variability among groups can be measured by the deviation of the average Observation in each group from the overall average, y. That is, the overall variance Obtained by replacing each observation with its group mean ( ), represents the Between group variability MSG. Its numerator is the sum of squares for groups (SSG), computed as
Where y is the mean of all N observations. Each group mean is treated as a single observation, so there are k–1 degrees of freedom associated with the SSG. The mean square for the GROUP effect is the sum of squares divided by its degrees of freedom
MSG = SSG / (k–1)
When the null hypothesis is true, the variation between groups should be the same as the variation within groups. Therefore, under H0, the test statistic F should be close to 1 and has an F-distribution with k–1 upper degrees of freedom and N–k lower degrees of freedom. Critical F-values based on the F-distribution are used to determine the rejection region.
Repeated measures ANOVA is the equivalent of the one-way ANOVA, but for related, not independent groups, and is the extension of the dependent t-test (paired). A repeated measures ANOVA is also referred to as a within-subjects ANOVA or ANOVA for correlated samples. All these names imply the nature of the repeated measures ANOVA, that of a test to detect any overall differences between related means.
It is used for two types of study design.
The repeated response measurements can be used to characterize a response profile over time.
The two-way ANOVA is a method for simultaneously analyzing two factors that affect a response. As in the one way ANOVA there is a group effect such as treatment group or dose level. The two-way ANOVA also includes another identifiable source of variation called a blocking factor whose variation can be separated from the error variation to give more precise group comparisons. For this reason the two way ANOVA layout is sometimes called a randomized block design.
The general entries in a two-way ANOVA summary table are represented as shown In below
The F-test is designed to test if two population variances are equal. It does this by comparing the ratio of two variances. So, if the variances are equal, the ratio of the variances will be 1.
The chi-square test is used to compare two independent binomial proportions p1 & p2. In the analysis of clinical data, the binomial proportions typically represent a response rate, cure rate, survival rate, abnormality rate or other rate. It’s used to compare above rates between a treated group and parallel control group. It is an approximate test which may be used when the normal approximation to the binomial distributions is valid and alternative of chi-square test is fisher’s exact test.
Observation is made of X1 responders out of n1 patients who are studied in one group, and X2 responders out of n2 patients in a second, independent group, as shown in below
Assume that each of the ni patients in Group i (i =1, 2) have the same chance, pi, of responding, so that X1 and X2 are independent binomial random variables .The goal is to compare population ‘response’ rates (p1 vs. p2) based on these sample data. Compute
Assuming that the normal approximation to the binomial distribution is applicable, the chi-square test summary is
This computing formula for the chi-square statistic can be shown below
where the Oi’s and Ei’s are the observed and expected cell frequencies, respectively, as shown in below Observed (O) and Expected (E) Cell Frequencies
The Wilcoxon signed rank test is a non-parametric analog of the one-sample t-test. The signed rank test can be used to make inferences about a population mean or median without requiring the assumption of normally distributed data. Wilcoxon signed rank test is based on the ranks of the data. In clinical trials is used to compare responses between correlated or paired data. Layout is same as that of paired differences t-test.
The Wilcoxon rank sum test is non-parametric analog of the two-sample t-test based on ranks of the data. It’s used to compare location parameter such as the mean or median.
Test is also applied to the analysis of ordered categorical data.
The kruskal-wallis test is a non-parametric analogue of the one-way ANOVA. It is used to compare population location parameters (mean, median etc.) among two or more groups based on independent samples. Just as one-way ANOVA, it is an extension of the two-sample t-test based on ranks of the data and used to compare responses among three or more dose groups or treatment groups using samples of non-normally distributed response data.
Friedman test is non-parametric alternative to the one-way ANOVA with repeated measures. It’s used to test for differences between groups when the dependent variable being measured is ordinal. It can also be used to continuous data that has violated the assumptions necessary to run the one-way ANOVA with repeated measures.
The binomial test is used to make inferences about a proportion or response rate based on a series of independent observations. Each resulting in one of two possible mutually exclusive outcomes. The outcomes can be response to treatment or no response, cure or no cure, survival or death or in general event or non-event. In clinical trials a common use of the binomial test is for estimating a response rate p using the no of patients (x) who respond to an investigating treatment out of total of an studied.
The general formula for a binomial probability is:
The Fisher Exact test is a test of significance that is used in the place of chi square test in 2 by 2 tables, especially in cases of small samples.
The Fisher Exact test tests the probability of getting a table that is as strong due to the chance of sampling. The word ‘strong’ is defined as the proportion of the cases that are diagonal with the most cases.
The Fisher Exact test is generally used in one tailed tests. However, it can also be used as a two tailed test as well. It is sometimes called a Fisher Irwin test. It is given this name because it was developed at the same time by Fisher, Irwin and Yates in 1930.
Given equal proportions, p1 = p2, the probability of observing the configuration. When the marginal totals are fixed, is found by the hyper geometric probability distribution as
is the combinatorial symbol that represents “the number of ways ‘b’ items can be Selected from a set of ‘a’ items”. (Note: The symbol ‘!’ is read ‘factorial’ with a! =a(a-1)(a-2)….(3)(2)(1). For example, 5! = (5)(4)(3)(2)(1) = 120.) The probability of the table configuration simplifies to
The p-value for the test, Fisher’s exact probability, is the probability of the observed configuration plus the sum of the probabilities of all other configurations with a more extreme result for fixed row and column totals.
The McNemar test is a non-parametric test for paired nominal data. It’s used when you are interested in finding a change in proportion for the paired data. For example, you could use this test to analyze retrospective case-control studies, where each treatment is paired with a control. It could also be used to analyze an experiment where two treatments are given to matched pairs. This test is sometimes referred to as McNemar’s Chi-Square test because the test statistic has a chi-square distribution.
The C.M.H test is used in clinical trials to compute two binomial proportions from independent population based on stratified samples. This test provides a means of combining a number of 2x2 tables of the type. The stratifications factor can represent patient subgroup such as study centers gender, age group or disease severity and acts similar to the blocking factor in a two-way ANOVA. The CMH test obtains an overall comparison of response rates adjusted for the stratification variables. The adjustment is simply a weighting of 2x2 tables in proportions to the within strata sample sizes. The CMH test is often used in the comparison of response rates between two treatment groups in a multi-center study using the study center as strata. A test used in the analysis of stratified or matched categorical data. It allows an investigator to test the association between a binary predictor or treat binary outcome such as case or control states while taking into account the stratification.
Let p1 and p2 denote the overall response rates for Group 1 and Group 2 respectively. For Stratum j, compute the quantities