PROC PRINT DATA=simp NOOBS SPLIT="*"; WHERE &outpx GE 1; TITLE2 "Table P1a. Population Simulation Parameters";

Size: px
Start display at page:

Download "PROC PRINT DATA=simp NOOBS SPLIT="*"; WHERE &outpx GE 1; TITLE2 "Table P1a. Population Simulation Parameters";"

Transcription

1 Simulation Program for Balanced Two Stage Cluster Sampling: Predictors of Realized Random Cluster Means Ed Stanek OPTIONS LINESIZE=140 PAGESIZE=53 NOCENTER NODATE NONUMBER NOFMTERR; ******* * PROJECT NAME: JASA Paper on 2-stage Balanced Cluster Sampling ; * PROGRAM NAME DATE PROGRAMMER ; TITLE1 "Source:ced03p30.sas C:\projects\cluster\programs 5/12/03 EJS " ; * Description: Simulation macro to evaluate predictors of a realized ; * cluster mean from two stage cluster sampling. ; * with changes to correct expressions for the MSE when there is ; * response error and improved efficiency for summarizing results ; * ; * ; * INPUT: none ; ******* LIBNAME new 'J:\projects\cluster\data'; *LIBNAME home v8 'C:\Documents and Settings\Administrator\My Documents\ed\projects\cluster\data'; %MACRO simc(bn,bm,mu_p,popv,popcv,trialn,ns,ms,nms,vbb,chk,outpx,outpxc,outpxu,oute); *****************************************; *** Generate Population Simulation Parameters; *****************************************; DATA simp (LABEL="Simulation Parameters"); bn=&bn; * Number of Clusters in the Population; bm=&bm; * Number of Days for a Subject; mu_p=&mu_p; * Population mean; popv=&popv; * Simulated Variance of Cluster means; popcv=&popcv; * Simulated Average Variance of days within clusters; LABEL bn="# Pop*Cluster:*BN" bm="# Pop*Units:*BM" mu_p="simulated*pop*mean:*mu_p" popv="simulated*cluster*var:*popv" popcv="simulated*unit*var:*popcv"; PROC PRINT DATA=simp NOOBS SPLIT="*"; WHERE &outpx GE 1; TITLE2 "Table P1a. Population Simulation Parameters"; *************************************************; *** Generate the Population of clusters *; *************************************************; DATA p1 (KEEP=s mu_s); ARRAY ys{&bn}; ssum=0; * Variable to construct Pop mean; 1

2 DO s=1 to &bn; * Generate cluster mean; ys{s}=round(&mu_p+sqrt(&popv)*rannor(234311),0.01); *Cluster average; ssum=ssum+ys{s}; ***************************************************; *** Re-center cluster parameters to pop mean ; ***************************************************; scr_mu=ssum/&bn-&mu_p; DO s=1 to &bn; ys{s}=ys{s}-scr_mu; mu_s=ys{s}; OUTPUT; PROC MEANS DATA=p1 N MEAN STD NOPRINT; VAR mu_s ; OUTPUT OUT=p1a VAR(mu_s)=v_musx; DATA p2 (DROP=v_musx); RETAIN v_mus; MERGE p1 p1a (KEEP=v_musx); IF _n_=1 then v_mus=v_musx; match=1; LABEL v_mus="cluster*var:*v_mus" s="cluster*label:*s" mu_s="cluster*parameter:*mu_s"; ********************** *** Generate Unit effects within clusters. These are centered at zero. There is one set ; *** of unit effects, where eventually, cluster means are added to the unit effects to ; *** form cluster-unit parameters ; ********************** DATA u1 (DROP=ssumc scr_muc sqsum u ); FILE PRINT; ***************************************************************; *** Generate Array of deviations of cluster-unit parameters ; ***************************************************************; *** Define arrays for deviations of cluster-unit parameters ; ***************************************************************; ARRAY t{&bm} ; *Array of Unit parameters; ssumc=0; * Variable to construct cluster mean; DO u=1 to &bm; *Generate Unit values for a cluster; t{u}=round(0+sqrt(&popcv)*rannor(124311),0.001); *Unit parameters; ssumc=ssumc+t{u}; ***************************************************; 2

3 *** Re-center unit parameters to zero for a cluster; ***************************************************; scr_muc=ssumc/&bm; * Initial average of unit deviations; sqsum=0; * Variable of squared values to construct cluster var ; DO u=1 to &bm; t{u}=t{u}-scr_muc; sqsum=sqsum+t{u}*t{u}; v_s=(sqsum)/(&bm-1); match=1; *Variable to combine back with cluster means; DATA p2b (DROP=match ); MERGE p2 u1; BY match; DATA p3 (DROP=u); SET p2b; FILE PRINT; ARRAY t{&bm}; *Cluster-unit parameters; DO u=1 to &bm; t{u}=mu_s+t{u}; *Cluster-unit parameter; bn=&bn; bm=&bm; mu_p=&mu_p; popv=&popv; popcv=&popcv; LABEL mu_p="simulated*pop*mean:*mu_p" popv="simulated*cluster*var:*popv" popcv="simulated*unit*var:*popcv" bn="# Pop*Cluster:*BN" bm="# Pop*Units:*BM" mu_p="pop*mean:*mu_p" v_s="parameter*unit*var:*v_s"; *************************************************; *** Obtain average of unit varinace over clusters; *************************************************; PROC MEANS NOPRINT DATA=p3; VAR v_s; OUTPUT OUT=p3a MEAN=v_ex; DATA p0 (DROP=v_ex); RETAIN v_e; MERGE p3 p3a(keep=v_ex); IF _N_=1 THEN v_e=v_ex; LABEL v_e="pop*ave*unit*var:*v_e"; ***** 3

4 *** Print results to summarize population simulation ; ***** * PROC CONTENTS DATA=p0; * WHERE &outpx GE 1; * TITLE2 "Table P2a. Contents of data set for simulated population"; PROC PRINT DATA=p0 (OBS=25) NOOBS SPLIT="*"; WHERE &outpx GE 1; VAR s bn bm mu_p v_mus v_s v_e mu_s t1-t4 ; FORMAT mu_p v_mus v_s v_e mu_s t1-t4 5.1; TITLE2 "Table P2b. List of first 25 clusters in simulated Population"; TITLE3 " for the first four units in a cluster"; PROC MEANS DATA=p0; WHERE &outpx GE 1; TITLE2 "Table P2c. Simple averages of population variables"; *************************************************************; *** Create module to randomly select two stage cluster sample; *** construct, and evaluate predictors ; *************************************************************; ********* *** Select a SRS without replacement of Clusters *; ********* DATA c1 (DROP=u s i p select rn rem_p rem_s ) c2 (KEEP=trial i s outpxc); trialn=&trialn; bn=&bn; ns=&ns; outpxc=&outpxc; LABEL bn="simulated*# Clusters:*BN" ns="sample*# Clusters:*NS"; ***********************************************************; *** Define number of simulations of samples to select *; ***********************************************************; ARRAY sx{&bn} _TEMPORARY_ ; * Array of cluster labels; ARRAY si{&ns}; * Array of cluster labels in the sample; DO trial=1 to &trialn; **************************************; *** Set initial conditions for a trial; **************************************; DO u=1 to &bn; * Create labels for clusters ; sx{u}=u; * Assign value to labeled cluster; 4

5 rem_p=&bn; * Initialize # of remaining clusters not selected in the population; rem_s=&ns; * Initialize # of clusters remaining to be selected in the sample; ****************************************; *** Select a cluster for position i in ; *** the sample ; ****************************************; DO i=1 to rem_s; select=0; * Indicator for selection of earlier cluster in listing; rn=ranuni(3362); * Pick a random number; ********************************************; *** Break the 0-1 interval into equal size *; *** segments with one segment for each *; *** remaining cluster not yet selected *; ********************************************; DO p=1 to rem_p; * For each remaining cluster in the population; IF (rn GE (p-1)/rem_p) AND (rn LT (p)/rem_p) AND select=0 THEN DO; si{i}=sx{p}; * Put the label for the selected cluster in the sample array; select=1; * Set the indicator of having a selected cluster to 1; ******** *** Output directly to strung out data set that can be directly linked to ; *** the population ; ******** s=si{i}; OUTPUT c2; IF select=1 AND p LT &bn THEN sx{p}=sx{p+1}; * Increment the array of un-selected cluster labels; sx{rem_p}=.; * Re-set remaining array value to missing; rem_p=rem_p-1; * Re-set the number of cluster remaining to be selected in the population; rem_s=rem_s-1; * Re-set the number of cluster remaining to be selected in the sample; OUTPUT c1; ************************************************; *** Optionally print some descriptive results *; ************************************************; PROC PRINT DATA=c1 (OBS=20) NOOBS; WHERE &outpxc=2; TITLE2 "Table C2-1. List of sampled Clusters"; PROC PRINT DATA=c2 (OBS=20) NOOBS; WHERE &outpxc=2; TITLE2 "Table C2-2. List of sampled clusters strung out with one record per position per trial"; PROC MEANS DATA=c1 ; 5

6 WHERE &outpxc=2; TITLE2 "Table C2-3. Average Cluster Number for Positions in Sample"; PROC FREQ DATA=c1; WHERE &outpxc=2; TABLES si1-si3; TITLE2 "Table C2-4. Frequency of cluster at a position"; *** Combine list of selected clusters with population data ; PROC SORT DATA=c2; * Arrange selected clusters by cluster number; BY s; DATA samp1; * Merge selected clusters with population data; MERGE p0 c2 (IN=a); BY s; IF a; LABEL i="position*in*sample:*i" trial="trial*number:*trial"; PROC SORT DATA=samp1; BY trial i; **********************************************************; *** Optional output **; **********************************************************; PROC PRINT DATA=samp1 (OBS=25) NOOBS; WHERE &outpxu GE 1; TITLE2 "Table S1-1. List of sampled clusters for first 25 observations"; *** Permute the units within clusters *; DATA samp2 (KEEP=trial s i bn bm ms mu_p mu_s v_mus v_s v_e vbb outpxu j1-j&ms) stest (KEEP=outpxu chk trial s tu j1-j&ms); SET samp1; BY trial; bm=&bm; * Total number of units in a cluster; ms=&ms; * Number of units in a sampled cluster; vbb=&vbb; * Response error variance for cluster-unit; chk=&chk; * Number of times to permute units in the first selected cluster; * as a test of the permutation program ; outpxu=&outpxu; * Indicator for optional output; LABEL bm="# SSUs/PSU*in Pop:*BM" vbb="response*error*var:*vbb" 6

7 ms="# SSU in Sample:*MS" chk="replications*of*unit*permuts:*chk"; ***********************************************************; *** Define number of simulations of samples to select *; ***********************************************************; FILE PRINT; **********************************************************; *** Permute units in a cluster for a trial *; **********************************************************; ARRAY t{&bm}; * Array of population unit values for cluster; ARRAY j{&ms}; * Array of unit-parameter values for positions in sample; ARRAY chkt{&bm}; * Array for use in checking permutations of units; DO ck=1 to &bm; * Set initial values of chk array to unit values; chkt{ck}=t{ck}; IF _N_=1 THEN chk=&chk; * For the first selected cluster, reset the replications of permuts; ELSE chk=1; DO tu=1 to chk; * Replicate the permutations for checking; *****************************************************************; *** Re-set original array of population unit values for a cluster; *** We do this to check the results for a particular cluster ; *****************************************************************; DO ck=1 to &bm; t{ck}=chkt{ck}; ***************************************************************; *** Set initial conditions for permuting the units in a cluster; ***************************************************************; rem_pc=&bm; * Initialize # of remaining units not selected in the cluster; rem_sc=&ms; * Initialize # of units remaining to be selected in the cluster; ****************************************; *** Select a unit for position j in ; *** the cluster ; ****************************************; DO unit=1 to rem_sc; selectc=0; * Indicator for selection of earlier cluster in listing; rn=ranuni(3362); * Pick a random number; ********************************************; *** Break the 0-1 interval into equal size *; *** segments with one segment for each *; *** remaining unit not yet selected *; ********************************************; DO p=1 to rem_pc; * For each remaining unit in the cluster; IF (rn GE (p-1)/rem_pc) AND (rn LT (p)/rem_pc) AND selectc=0 THEN DO; j{unit}=t{p}+sqrt(&vbb)*rannor(2341); * Put the unit-value in the sample position; 7

8 selectc=1; * Set the indicator of having selected a unit to 1; IF selectc=1 AND p LT &bm THEN t{p}=t{p+1}; * Increment the array of un-selected unit values; t{rem_pc}=.; * Re-set remaining array value to missing; rem_pc=rem_pc-1; * Re-set the number of units remaining to be selected in the cluster; rem_sc=rem_sc-1; * Re-set the number of units remaining to be selected in the sample; IF _N_=1 THEN OUTPUT stest; *Output to the test data set for checking permutations; OUTPUT samp2; * Output to sample data set; PROC PRINT DATA=stest (OBS=25); WHERE &outpxu GE 2; VAR trial s tu j1-j4; TITLE2 "Table U2-1. Sample Test of Unit permutations"; PROC MEANS DATA=stest MEAN STDERR N; WHERE &outpxu GE 2; VAR j1-j4; TITLE2 "Table U2-2. Average of Values of positions for permuted units in the first selected Cluster"; *** Construct Predictors and MSE ***; PROC SORT DATA=samp2; BY TRIAL; DATA e1 (KEEP=oute trial i s mu_s p1-p9 smse1-smse9) e2(keep=trial tmse1-tmse9 sqd1-sqd9) ; SET samp2 END=lastrec; * Create variable to compute summary statistics at last record; BY trial; FILE PRINT; ARRAY yj{&ms} j1-j&ms; * Values for a sampled cluster; ARRAY sp{&ns,&ms}; * Values for 2-stage cluster sample; ARRAY slabel{&ns}; * Labels for selected units; ARRAY mus{&ns}; * True Parameter for selected units; ARRAY yibx{&ns}; * Average of values for sample units in sample cluster; ARRAY wib{&ns}; * Array of weights for sampled cluster units; ARRAY yibw{&ns}; * Array of weighted average values for sample units in sample cluster; ARRAY sqd{9}; * Sum of squared deviations of predictors from true mean; oute=&oute; 8

9 nms=&nms; *PUT &nms= nms=; *IF &nms NE &ns*&ms THEN PUT "Number of Sample Units=" &nms ; *IF &nms NE &ns*&ms THEN PUT " Does NOT Match n*m=" &ns " * " &ms ; ***************** *** Initialize sum of squared deviations of predictors about true parameter to zero; ***************** IF _N_=1 THEN DO e=1 to 9; sqd{e}=0; * *** Compute various values needed to evaluate trial averages ; *** We first do this for clusters values without response error ; *** We then repeat it for cluster values with response error ; * ***********************************************************; *** Create an array of data for a trial *; ***********************************************************; RETAIN sp1-sp&nms; *Array of sample data ; RETAIN yibx1-yibx&ns; *Array of sample means of cluster units; RETAIN wib1-wib&ns; *Array of weights for sampled cluster units; RETAIN yibw1-yibw&ns; * Array of weighted average values for sample units in sample cluster; RETAIN slabel1-slabel&ns; * Labels for selected clusters; RETAIN mus1-mus&ns; * Parameter mean for selected clusters; RETAIN sqd1-sqd9; * Sum of the squared deviations of predictors; * RETAIN msb mse; * Sums to determine MSE and MSB to estimate shrinkage constants; ***********************************************; *** Initialize cluster sample values to missing; ***********************************************; IF FIRST.trial EQ 1 THEN DO; DO ix=1 to &ns; yibx{ix}=.; *Initialize cluster sample averages; wib{ix}=.; *Initialize weights for cluster averages to missing; yibw{ix}=.; *Initialize weighted cluster averages to missing; slabel{ix}=.; *Initialize selected unit labels to missing; mus{ix}=.; *Initialize selected unit parameters to missing; DO jx=1 to &ms; SP{ix,jx}=.; *Initialize cluster sample values to missing; * msb=0; *Initialize ms(between clusters) to missing for trial; * mse=0; *Initialize ms(within cluster) to missing for trial; ******************************************************; *** Read in sample data into array of trial values. *; 9

10 *** Evaluate inverse variance weight for WLS mean *; ******************************************************; vi=v_s+vbb; * Variance of units in cluster and response error in cluster; * Note: this is constant for all clusters ; DO ix=1 to &ns; tm=0; tiv=0; DO jx=1 to &ms; IF ix=i THEN sp{ix, jx}=yj{jx}; * Set values for selected cluster-units; tm=tm+sp{ix, jx}; * Compute total of response for sampled units in cluster; tvi=tiv+vi; * Compute total of variance for sampled units in cluster; yibx{ix}=tm/&ms; * Evaluate simple cluster mean ; wib{ix}=1/(v_mus+tvi/&ms); * Quantity to get weight for WLS predictor for Mixed and SS; * Note: this is constant for all clusters ; yibw{ix}=yibx{ix}*wib{ix}; * Evaluate weighted cluster mean; IF ix=i THEN DO; slabel{ix}=s; mus{ix}=mu_s; **************************; * Optional Level 2 Output; **************************; IF &oute GE 2 THEN DO; PUT trial= i= sp{1,1}= sp{1,2}= sp{1,3}= /@10 yibx{1}= yibx{2}= yibx{3}= wib{1}= wib{2}= ; PUT trial= i= sp{2,1}= sp{2,2}= sp{2,3}= /@10 yibx{1}= yibx{2}= yibx{3}= wib{1}= wib{2}= ; PUT trial= i= sp{3,1}= sp{3,2}= sp{3,3}= /@10 yibx{1}= yibx{2}= yibx{3}= wib{1}= wib{2}= /; IF &oute GE 2 THEN DO; PUT trial= yibx{1}= yibx{2}= 'Mean of clusters'; PUT trial= wib{1}= wib{2}= 'inverse variance wt'//; IF &oute GE 2 THEN DO; PUT trial= slabel{1}= slabel{2}= 'Label of selected cluster'; PUT trial= mus{1}= mus{2}= 'Parameter for mean of selected cluster'//; *******************************************************; *** Compute MSE terms for a trial *; *******************************************************; IF LAST.trial THEN DO; * Set the values in an array for subsequent processing; IF &oute GE 1 THEN PUT "For Each Trial"; *******************************************; *** Display trial results for checking **; *******************************************; 10

11 IF &oute GE 1 THEN DO; IF trial LE 5 THEN PUT trial= (yibx1-yibx&ns) (+2 5.2) ' Mean of clusters'; IF trial LE 5 THEN PUT trial= (wib1-wib&ns) (+2 5.2) ' Inverse Var of Cluster mean'/; IF trial LE 5 THEN PUT trial= (slabel1-slabel&ns) (+2 5.0) ' Label of selected clusters'/; IF trial LE 5 THEN PUT trial= (mus1-mus&ns) (+2 5.2) ' Parameter mean of selected cluster'//; *******************************************************; *** FOR EACH TRIAL **; *** Construct: **; *** simple mean of cluster means **; *** weighted cluster mean **; *******************************************************; ybb=mean(of yibx{*}); * Simple mean of cluster means; muwhat=mean(of yibw{*})/mean(of wib{*}); * Weighted mean of cluster means; IF &oute GE 1 THEN PUT ybb= ' Mean of cluster means'/ muwhat= ' Weighted cluster mean'; *********************************************************; *** Construct estimates of shrinkage constants *; *********************************************************; msb=0; mse=0; DO ixx=1 to &ns; DO jx=1 to &ms; mse=mse+(sp{ixx,jx}-yibx{ixx})**2; IF &oute GE 2 THEN PUT "mse detail" trial= mse= sp{ixx,jx}= ixx= jx=; msb=msb+(yibx{ixx}-ybb)**2; mse=mse/(&ns*(&ms-1)); *Mean squared error of unit deviations within clusters; msb=msb/(&ns-1); *Mean square of cluster means about overall mean; IF &oute GE 2 THEN PUT trial= mse= msb= "TRIAL AND MSB"; *****************************************************; *** For each selected cluster in each trial *; *** compute predictors *; *****************************************************; DO ix=1 to &ns; ***** *** Predictors *; ***** * Define unit sampling fraction ; f=&ms/&bm; * Define true shrinkage constants ; vstar=v_mus-v_e/&bm; * V star for use in RP model; ki=&ms*v_mus/(&ms*v_mus+vi); * Mixed Model true shrinkage constant; k=&ms*vstar/(&ms*vstar+v_e); * RP model true shrinkage constant; kstar=&ms*vstar/(&ms*vstar+v_e+vbb); * RP model k* shrinkage constant denom resp error; 11

12 error; krstar=(&ms*vstar+v_e)/(&ms*vstar+v_e+vbb); * RP model k* shrinkage constant num unit var den resp *** Estimate variance components ; vbb_e=&vbb; * Externally assumed known response error variance; v_ee=max(mse-vbb_e,0); * Estimated average var of units for a cluster; vi_e=mse; * Estimated variance of selected cluster and resp error; v_muse=max( (msb-mse+&ms*v_ee/&bm)/&ms,0); * Estimated variance between clusters; vstar_e=max( (msb-mse)/&ms,0); * Estimated adjusted variance of selected cluster for RP model; * Define estimated shrinkage constant ; ki_e=&ms*v_muse/(&ms*v_muse+vi_e); * Mixed Model estimated shrinkage constant; k_e=&ms*vstar_e/(&ms*vstar_e+v_ee); * RP model estimated shrinkage constant; kstar_e=&ms*vstar_e/(&ms*vstar_e+v_ee+vbb_e); * RP model k* estimated shrinkage constant denom resp error; krstar_e=(&ms*vstar_e+v_ee)/(&ms*vstar_e+v_ee+vbb_e); * RP model k* shrinkage constant num unit var den resp error; ********************************************; *** Optional checking output *; ********************************************; IF &oute GE 2 AND TRIAL le 5 THEN PUT mse= msb= ki_e= k_e= kstar_e= kstar_e= "Estimated Shrinkage Constants"; **************************************************************; *** Define array values for a and b to form predictors and MSE; *** See Table 2 of c03ed11.doc for the definitions ; *** The order of the predictors is as follows ; *** p=1 simple mean ; *** p=2 mixed model predictor ; *** p=3 scott and smith predictor ; *** p=4 rp model predictor ; *** p=5 rp model predictor with response error ; *** p=6 mixed model predictor with estimated shrinkage ; *** p=7 scott and smith predictor with estim. shrinkage ; *** p=8 rp model predictor with estim. shrinkage ; *** p=9 rp model predictor with response error with estim; *** shrinkage constant ; * *** Compute various values to evaluate simple mean as predictor *; * i=ix; s=slabel{ix}; mu_s=mus{ix}; ARRAY a{9}; * Coefficient that multiplies overall mean; ARRAY b{9}; * Coefficient that multiplies cluster mean; ARRAY p{9}; * Predictor of realized Cluster Mean; 12

13 ARRAY tmse{9}; * Theoretical Value of MSE ; ARRAY smse{9}; * Squared deviation of predictor from true mean; a{1}=0 ; b{1}=1; *Sample mean; a{2}=1-ki ; b{2}=ki; *Mixed model; a{3}=(1-f)*(1-ki); b{3}=f+(1-f)*ki; *Scott+Smith; a{4}=(1-f)*(1-k); b{4}=f+(1-f)*k; *RP Model ; a{5}=f*(1-krstar)+(1-f)*(1-kstar); b{5}=f*krstar+(1-f)*kstar; *RP with Resp Error Model; a{6}=1-ki_e ; b{6}=ki_e; *Mixed model; a{7}=(1-f)*(1-ki_e); b{7}=f+(1-f)*ki_e; *Scott+Smith; a{8}=(1-f)*(1-k_e); b{8}=f+(1-f)*k_e; *RP Model ; a{9}=f*(1-krstar_e)+(1-f)*(1-kstar_e); b{9}=f*krstar_e+(1-f)*kstar_e; *RP with Resp Error Model; yib=yibx{ix}; *Simple cluster mean; DO e=1 to 9; p{e}=a{e}*ybb+b{e}*yib; * Predictor of cluster mean; smse{e}=(p{e}-mu_s)**2; * Squared deviation of predictor; sqd{e}=sqd{e}+smse{e}; * Sum of Squared deviation of predictor; LABEL p1="cluster*mean:*p1" p2="mixed*model*blup:*p2" p3="scott*+smith*blup:*p3" p4="rp*model*pred:*p4" p5="rp*resperr*model*pred:*p5" p6="est*mixed*model*blup:*p6" p7="est*scott*+smith*blup:*p7" p8="est*rp*model*pred:*p8" p9="est*rp*resperr*model*pred:*p9"; *OUTPUT e1; *****************************************************; *** Compute average MSE from simulation and *; *** theoretical MSE *; *****************************************************; IF lastrec=1 THEN DO; DO e=1 to 9; sqd{e}=sqd{e}/(&trialn*&ns); *Calculate average MSE from simulation; IF e le 5 THEN tmse{e}=((a{e}+b{e})**2) * ((v_e+vbb)/(&ns*&ms) + vstar/&ns - v_mus/&bn) +2*(a{e}+b{e})*v_mus/&bn + -2*((a{e}+&ns*b{e})/&ns) * (v_e/&bm + vstar) + (b{e}**2) * ((&ns-1)/&ns) * ((v_e+vbb)/&ms + vstar) + (vstar-v_mus/&bn) + v_e/&bm ; OUTPUT e2; 13

14 *************************************************; *** Construct summary estimated MSE *; *************************************************; PROC FORMAT; VALUE typf 0="Unkn k est" 1="Estimates" 2="Theoretical" 3="Difference"; DATA e3 (KEEP=typ ntot stat1-stat5); SET e2; ARRAY stat{5}; ARRAY tmse{5}; ARRAY sqd{9}; ARRAY dmse{5}; ntot=&trialn*&ns; DO e=1 to 5; IF e=1 THEN stat{e}=sqd{e}; IF e GT 1 THEN stat{e}=sqd{e+4}; *Use estimated shrinkage constants; typ=0; OUTPUT; DO e=1 to 5; stat{e}=sqd{e}; typ=1; OUTPUT; DO e=1 to 5; stat{e}=tmse{e}; typ=2; OUTPUT; DO e=1 to 5; stat{e}=sqd{e}-tmse{e}; typ=3; OUTPUT; LABEL stat1="mse*cluster*mean:*stat1" stat2="mse*mm BLUP:*STAT2" stat3="mse*ss BLUP:*STAT3" stat4="mse*rp BLUP:*STAT4" stat5="mse*rp+re BLUP:*STAT5" ntot="total # of*simulated*clusters:*ntot" typ="statistic*parameter*difference:*typ"; ***************************************************; 14

15 *** Print main results ***; ***************************************************; PROC PRINT DATA=p0 (OBS=1) SPLIT="*" NOOBS; VAR bn bm mu_p v_mus v_e ; FORMAT mu_p v_mus v_e 7.4; TITLE2 "Table Summary Population Parameters"; PROC PRINT DATA=e3 SPLIT="*" NOOBS; WHERE &vbb=0 ; VAR ntot typ stat1-stat4; FORMAT typ typf. stat1-stat4 f9.7; TITLE2 "Table Summary of MSE results: N=&bn (n=&ns) M=&bm (m=&ms) Pop-Mean=&mu_p Resp.Error-Var=&vbb "; PROC PRINT DATA=e3 SPLIT="*" NOOBS; WHERE &vbb NE 0 ; VAR ntot typ stat1-stat3 stat5; FORMAT typ typf. stat1-stat5 f9.7; TITLE2 "Table Summary of MSE results: N=&bn (n=&ns) M=&bm (m=&ms) Pop-Mean=&mu_p Resp.Error-Var=&vbb "; ***************************************************; *** Optional output for predictors of cluster means; ***************************************************; PROC PRINT DATA=e1 (OBS=25) SPLIT="*"; WHERE oute=1; VAR trial i s mu_s p1-p5; FORMAT mu_s p1-p5 f7.4; TITLE2 "Table Predictors of Cluster Means"; %M %simc(1000, /*# Clusters in population: N */ 60, /*# Units in a cluster: M */ 50, /*Population mean mu */ 8, /*Var Between Cluster means */ 400, /*Var Between Units in clusters*/ 500, /*# of trials */ 30, /*# Clusters in sample : n */ 4, /*# Number of Units per cluster in sample: m*/ 120, /*# Number of units in sample=n*m */ 0, /*Response error on cluster-unit*/ 1, /*# samples per selected cluster. Set=1 unless you want to check the permutations*/ 15

16 0, /*Value to control printed output for population: 0=none, 1=limited, 2=a lot*/ 0, /*Value to control printed cluster selection output: 0=none, 1=limited, 2=a log*/ 0, /*Value to control printed unit selection output: 0=none, 1=limited, 2=a lot*/ 0 /*Value to control printed output for development of predictors: 0=none 1=limited, 2=a lot*/ ); 16

Fall 2015 Solutions. Biostats691F: Practical Data Management and Statistical Computing

Fall 2015 Solutions. Biostats691F: Practical Data Management and Statistical Computing Fall 2015 Solutions Biostats691F: Practical Data Management and Statistical Computing Assignment 8: Creating a Preliminary Data Report - The Fetal Lung Maturity Study Data for the study were available

More information

wine 1 wine 2 wine 3 person person person person person

wine 1 wine 2 wine 3 person person person person person 1. A trendy wine bar set up an experiment to evaluate the quality of 3 different wines. Five fine connoisseurs of wine were asked to taste each of the wine and give it a rating between 0 and 10. The order

More information

Appendix Table A1 Number of years since deregulation

Appendix Table A1 Number of years since deregulation Appendix Table A1 Number of years since deregulation This table presents the results of -in-s models incorporating the number of years since deregulation and using data for s with trade flows are above

More information

5 Populations Estimating Animal Populations by Using the Mark-Recapture Method

5 Populations Estimating Animal Populations by Using the Mark-Recapture Method Name: Period: 5 Populations Estimating Animal Populations by Using the Mark-Recapture Method Background Information: Lincoln-Peterson Sampling Techniques In the field, it is difficult to estimate the population

More information

Multiple Imputation for Missing Data in KLoSA

Multiple Imputation for Missing Data in KLoSA Multiple Imputation for Missing Data in KLoSA Juwon Song Korea University and UCLA Contents 1. Missing Data and Missing Data Mechanisms 2. Imputation 3. Missing Data and Multiple Imputation in Baseline

More information

Online Appendix to. Are Two heads Better Than One: Team versus Individual Play in Signaling Games. David C. Cooper and John H.

Online Appendix to. Are Two heads Better Than One: Team versus Individual Play in Signaling Games. David C. Cooper and John H. Online Appendix to Are Two heads Better Than One: Team versus Individual Play in Signaling Games David C. Cooper and John H. Kagel This appendix contains a discussion of the robustness of the regression

More information

From VOC to IPA: This Beer s For You!

From VOC to IPA: This Beer s For You! From VOC to IPA: This Beer s For You! Joel Smith Statistician Minitab Inc. jsmith@minitab.com 2013 Minitab, Inc. Image courtesy of amazon.com The Data Online beer reviews Evaluated overall and: Appearance

More information

Missing Data Treatments

Missing Data Treatments Missing Data Treatments Lindsey Perry EDU7312: Spring 2012 Presentation Outline Types of Missing Data Listwise Deletion Pairwise Deletion Single Imputation Methods Mean Imputation Hot Deck Imputation Multiple

More information

Panel A: Treated firm matched to one control firm. t + 1 t + 2 t + 3 Total CFO Compensation 5.03% 0.84% 10.27% [0.384] [0.892] [0.

Panel A: Treated firm matched to one control firm. t + 1 t + 2 t + 3 Total CFO Compensation 5.03% 0.84% 10.27% [0.384] [0.892] [0. Online Appendix 1 Table O1: Determinants of CMO Compensation: Selection based on both number of other firms in industry that have CMOs and number of other firms in industry with MBA educated executives

More information

2 nd Midterm Exam-Solution

2 nd Midterm Exam-Solution 2 nd Midterm Exam- اس تعن ابهلل وكن عىل يقني بأ ن لك ما ورد يف هذه الورقة تعرفه جيدا وقد تدربت عليه مبا فيه الكفاية Question #1: Answer the following with True or False: 1. The non-parametric input modeling

More information

Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006

Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006 Dr. Roland Füss Winter Term 2005/2006 Final Exam Financial Data Analysis (6 Credit points/imp Students) March 2, 2006 Note the following important information: 1. The total disposal time is 60 minutes.

More information

Business Statistics /82 Spring 2011 Booth School of Business The University of Chicago Final Exam

Business Statistics /82 Spring 2011 Booth School of Business The University of Chicago Final Exam Business Statistics 41000-81/82 Spring 2011 Booth School of Business The University of Chicago Final Exam Name You may use a calculator and two cheat sheets. You have 3 hours. I pledge my honor that I

More information

Missing Data: Part 2 Implementing Multiple Imputation in STATA and SPSS. Carol B. Thompson Johns Hopkins Biostatistics Center SON Brown Bag 4/24/13

Missing Data: Part 2 Implementing Multiple Imputation in STATA and SPSS. Carol B. Thompson Johns Hopkins Biostatistics Center SON Brown Bag 4/24/13 Missing Data: Part 2 Implementing Multiple Imputation in STATA and SPSS Carol B. Thompson Johns Hopkins Biostatistics Center SON Brown Bag 4/24/13 Overview Reminder Steps in Multiple Imputation Implementation

More information

Journal of Nanosciences: Current Research

Journal of Nanosciences: Current Research ent Research rrjournal of Nanosciences: Cu Journal of Nanosciences: Current Research Keita et al., J Nanosci Curr Res 2018, 3:2 DOI: 10.4172/2572-0813.1000123 Supplementary File Open Access SAS Data Error

More information

AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship

AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship AJAE Appendix: Testing Household-Specific Explanations for the Inverse Productivity Relationship Juliano Assunção Department of Economics PUC-Rio Luis H. B. Braido Graduate School of Economics Getulio

More information

Update to A Comprehensive Look at the Empirical Performance of Equity Premium Prediction

Update to A Comprehensive Look at the Empirical Performance of Equity Premium Prediction Update to A Comprehensive Look at the Empirical Performance of Equity Premium Prediction Amit Goyal UNIL Ivo Welch UCLA September 17, 2014 Abstract This file contains updates, one correction, and links

More information

The R survey package used in these examples is version 3.22 and was run under R v2.7 on a PC.

The R survey package used in these examples is version 3.22 and was run under R v2.7 on a PC. CHAPTER 7 ANALYSIS EXAMPLES REPLICATION-R SURVEY PACKAGE 3.22 GENERAL NOTES ABOUT ANALYSIS EXAMPLES REPLICATION These examples are intended to provide guidance on how to use the commands/procedures for

More information

Missing value imputation in SAS: an intro to Proc MI and MIANALYZE

Missing value imputation in SAS: an intro to Proc MI and MIANALYZE Victoria SAS Users Group November 26, 2013 Missing value imputation in SAS: an intro to Proc MI and MIANALYZE Sylvain Tremblay SAS Canada Education Copyright 2010 SAS Institute Inc. All rights reserved.

More information

RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS ABSTRACT

RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS ABSTRACT RELATIVE EFFICIENCY OF ESTIMATES BASED ON PERCENTAGES OF MISSINGNESS USING THREE IMPUTATION NUMBERS IN MULTIPLE IMPUTATION ANALYSIS Nwakuya, M. T. (Ph.D) Department of Mathematics/Statistics University

More information

Method for the imputation of the earnings variable in the Belgian LFS

Method for the imputation of the earnings variable in the Belgian LFS Method for the imputation of the earnings variable in the Belgian LFS Workshop on LFS methodology, Madrid 2012, May 10-11 Astrid Depickere, Anja Termote, Pieter Vermeulen Outline 1. Introduction 2. Imputation

More information

You know what you like, but what about everyone else? A Case study on Incomplete Block Segmentation of white-bread consumers.

You know what you like, but what about everyone else? A Case study on Incomplete Block Segmentation of white-bread consumers. You know what you like, but what about everyone else? A Case study on Incomplete Block Segmentation of white-bread consumers. Abstract One man s meat is another man s poison. There will always be a wide

More information

Flexible Imputation of Missing Data

Flexible Imputation of Missing Data Chapman & Hall/CRC Interdisciplinary Statistics Series Flexible Imputation of Missing Data Stef van Buuren TNO Leiden, The Netherlands University of Utrecht The Netherlands crc pness Taylor &l Francis

More information

Growth in early yyears: statistical and clinical insights

Growth in early yyears: statistical and clinical insights Growth in early yyears: statistical and clinical insights Tim Cole Population, Policy and Practice Programme UCL Great Ormond Street Institute of Child Health London WC1N 1EH UK Child growth Growth is

More information

Activity 10. Coffee Break. Introduction. Equipment Required. Collecting the Data

Activity 10. Coffee Break. Introduction. Equipment Required. Collecting the Data . Activity 10 Coffee Break Economists often use math to analyze growth trends for a company. Based on past performance, a mathematical equation or formula can sometimes be developed to help make predictions

More information

Decision making with incomplete information Some new developments. Rudolf Vetschera University of Vienna. Tamkang University May 15, 2017

Decision making with incomplete information Some new developments. Rudolf Vetschera University of Vienna. Tamkang University May 15, 2017 Decision making with incomplete information Some new developments Rudolf Vetschera University of Vienna Tamkang University May 15, 2017 Agenda Problem description Overview of methods Single parameter approaches

More information

Computerized Models for Shelf Life Prediction of Post-Harvest Coffee Sterilized Milk Drink

Computerized Models for Shelf Life Prediction of Post-Harvest Coffee Sterilized Milk Drink Libyan Agriculture esearch Center Journal International (6): 74-78, 011 ISSN 19-4304 IDOSI Publications, 011 Computerized Models for Shelf Life Prediction of Post-Harvest Coffee Sterilized Milk Drink 1

More information

Handling Missing Data. Ashley Parker EDU 7312

Handling Missing Data. Ashley Parker EDU 7312 Handling Missing Data Ashley Parker EDU 7312 Presentation Outline Types of Missing Data Treatments for Handling Missing Data Deletion Techniques Listwise Deletion Pairwise Deletion Single Imputation Techniques

More information

Gail E. Potter, Timo Smieszek, and Kerstin Sailer. April 24, 2015

Gail E. Potter, Timo Smieszek, and Kerstin Sailer. April 24, 2015 Supplementary Material to Modelling workplace contact networks: the effects of organizational structure, architecture, and reporting errors on epidemic predictions, published in Network Science Gail E.

More information

Comparing R print-outs from LM, GLM, LMM and GLMM

Comparing R print-outs from LM, GLM, LMM and GLMM 3. Inference: interpretation of results, plotting results, confidence intervals, hypothesis tests (Wald,LRT). 4. Asymptotic distribution of maximum likelihood estimators and tests. 5. Checking the adequacy

More information

The SAS System 09:38 Wednesday, December 2, The CANDISC Procedure

The SAS System 09:38 Wednesday, December 2, The CANDISC Procedure The SAS System 09:38 Wednesday, December 2, 2009 63 Observations 67 DF Total 66 Variables 43 DF Within Classes 65 Classes 2 DF Between Classes 1 Class Level Information Variable SPECIES Name Frequency

More information

ENGI E1006 Percolation Handout

ENGI E1006 Percolation Handout ENGI E1006 Percolation Handout NOTE: This is not your assignment. These are notes from lecture about your assignment. Be sure to actually read the assignment as posted on Courseworks and follow the instructions

More information

The multivariate piecewise linear growth model for ZHeight and zbmi can be expressed as:

The multivariate piecewise linear growth model for ZHeight and zbmi can be expressed as: Bi-directional relationships between body mass index and height from three to seven years of age: an analysis of children in the United Kingdom Millennium Cohort Study Supplementary material The multivariate

More information

Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good

Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good Relationships Among Wine Prices, Ratings, Advertising, and Production: Examining a Giffen Good Carol Miu Massachusetts Institute of Technology Abstract It has become increasingly popular for statistics

More information

Internet Appendix for CEO Personal Risk-taking and Corporate Policies TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay)

Internet Appendix for CEO Personal Risk-taking and Corporate Policies TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay) TABLE IA.1 Pilot CEOs and Firm Risk (Controlling for High Performance Pay) OLS regressions with annualized standard deviation of firm-level monthly stock returns as the dependent variable. A constant is

More information

STAT 5302 Applied Regression Analysis. Hawkins

STAT 5302 Applied Regression Analysis. Hawkins Homework 3 sample solution 1. MinnLand data STAT 5302 Applied Regression Analysis. Hawkins newdata

More information

A latent class approach for estimating energy demands and efficiency in transport:

A latent class approach for estimating energy demands and efficiency in transport: Energy Policy Research Group Seminars A latent class approach for estimating energy demands and efficiency in transport: An application to Latin America and the Caribbean Manuel Llorca Oviedo Efficiency

More information

An application of cumulative prospect theory to travel time variability

An application of cumulative prospect theory to travel time variability Katrine Hjorth (DTU) Stefan Flügel, Farideh Ramjerdi (TØI) An application of cumulative prospect theory to travel time variability Sixth workshop on discrete choice models at EPFL August 19-21, 2010 Page

More information

Missing Data Imputation Method Comparison in Ohio University Student Retention. Database. A thesis presented to. the faculty of

Missing Data Imputation Method Comparison in Ohio University Student Retention. Database. A thesis presented to. the faculty of Missing Data Imputation Method Comparison in Ohio University Student Retention Database A thesis presented to the faculty of the Russ College of Engineering and Technology of Ohio University In partial

More information

Notes on the Philadelphia Fed s Real-Time Data Set for Macroeconomists (RTDSM) Capacity Utilization. Last Updated: December 21, 2016

Notes on the Philadelphia Fed s Real-Time Data Set for Macroeconomists (RTDSM) Capacity Utilization. Last Updated: December 21, 2016 1 Notes on the Philadelphia Fed s Real-Time Data Set for Macroeconomists (RTDSM) Capacity Utilization Last Updated: December 21, 2016 I. General Comments This file provides documentation for the Philadelphia

More information

Curtis Miller MATH 3080 Final Project pg. 1. The first question asks for an analysis on car data. The data was collected from the Kelly

Curtis Miller MATH 3080 Final Project pg. 1. The first question asks for an analysis on car data. The data was collected from the Kelly Curtis Miller MATH 3080 Final Project pg. 1 Curtis Miller 4/10/14 MATH 3080 Final Project Problem 1: Car Data The first question asks for an analysis on car data. The data was collected from the Kelly

More information

STA Module 6 The Normal Distribution

STA Module 6 The Normal Distribution STA 2023 Module 6 The Normal Distribution Learning Objectives 1. Explain what it means for a variable to be normally distributed or approximately normally distributed. 2. Explain the meaning of the parameters

More information

STA Module 6 The Normal Distribution. Learning Objectives. Examples of Normal Curves

STA Module 6 The Normal Distribution. Learning Objectives. Examples of Normal Curves STA 2023 Module 6 The Normal Distribution Learning Objectives 1. Explain what it means for a variable to be normally distributed or approximately normally distributed. 2. Explain the meaning of the parameters

More information

Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches

Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches Return to wine: A comparison of the hedonic, repeat sales, and hybrid approaches James J. Fogarty a* and Callum Jones b a School of Agricultural and Resource Economics, The University of Western Australia,

More information

Flexible Working Arrangements, Collaboration, ICT and Innovation

Flexible Working Arrangements, Collaboration, ICT and Innovation Flexible Working Arrangements, Collaboration, ICT and Innovation A Panel Data Analysis Cristian Rotaru and Franklin Soriano Analytical Services Unit Economic Measurement Group (EMG) Workshop, Sydney 28-29

More information

Mini Project 3: Fermentation, Due Monday, October 29. For this Mini Project, please make sure you hand in the following, and only the following:

Mini Project 3: Fermentation, Due Monday, October 29. For this Mini Project, please make sure you hand in the following, and only the following: Mini Project 3: Fermentation, Due Monday, October 29 For this Mini Project, please make sure you hand in the following, and only the following: A cover page, as described under the Homework Assignment

More information

HW 5 SOLUTIONS Inference for Two Population Means

HW 5 SOLUTIONS Inference for Two Population Means HW 5 SOLUTIONS Inference for Two Population Means 1. The Type II Error rate, β = P{failing to reject H 0 H 0 is false}, for a hypothesis test was calculated to be β = 0.07. What is the power = P{rejecting

More information

Transportation demand management in a deprived territory: A case study in the North of France

Transportation demand management in a deprived territory: A case study in the North of France Transportation demand management in a deprived territory: A case study in the North of France Hakim Hammadou and Aurélie Mahieux mobil. TUM 2014 May 20th, 2014 Outline 1) Aim of the study 2) Methodology

More information

Adelaide Plains Wine Region

Adelaide Plains Wine Region SA Winegrape Crush Survey Regional Summary Report 2017 Adelaide Plains Wine Region Adelaide Plains Vintage overview OVERVIEW OF VINTAGE STATISTICS A total of 3,496 tonnes of Adelaide Plains winegrapes

More information

The premium for organic wines

The premium for organic wines Enometrics XV Collioure May 29-31, 2008 Estimating a hedonic price equation from the producer side Points of interest: - assessing whether there is a premium for organic wines, and which one - estimating

More information

Wine Rating Prediction

Wine Rating Prediction CS 229 FALL 2017 1 Wine Rating Prediction Ke Xu (kexu@), Xixi Wang(xixiwang@) Abstract In this project, we want to predict rating points of wines based on the historical reviews from experts. The wine

More information

Fleurieu zone (other)

Fleurieu zone (other) Fleurieu zone (other) Incorporating Southern Fleurieu and Kangaroo Island wine regions, as well as the remainder of the Fleurieu zone outside all GI regions Regional summary report 2006 South Australian

More information

Seed Spacing Performance Of Common Row Crop Planters With Oil Seed Sunflowers

Seed Spacing Performance Of Common Row Crop Planters With Oil Seed Sunflowers Seed Spacing Performance Of Common Row Crop Planters With Oil Seed Sunflowers John A. Smith Michael F. Kocher Biological Systems Engineering Dept. University of Nebraska 2008 Project Objectives Examine

More information

Japan Consumer Trial Results

Japan Consumer Trial Results Japan Consumer Trial Results MLA Seminars, January 2007 1 Japanese Trial Consumer Objectives Evaluate the sensory response of Japanese consumers Evaluate responses across a full quality range x three cooking

More information

EXPERIMENT NO. 3 HYDROMETER ANALYSIS ASTM D-422

EXPERIMENT NO. 3 HYDROMETER ANALYSIS ASTM D-422 EXPERIMENT NO. 3 HYDROMETER ANALYSIS ASTM D-422 1. AIM To determine grain size distribution of soil, which contains appreciable quantity of soil passing ASTM 200 sieve ( 0.075 mm). 2. APPARATUS: Standard

More information

Online Appendix for. To Buy or Not to Buy: Consumer Constraints in the Housing Market

Online Appendix for. To Buy or Not to Buy: Consumer Constraints in the Housing Market Online Appendix for To Buy or Not to Buy: Consumer Constraints in the Housing Market By Andreas Fuster and Basit Zafar, Federal Reserve Bank of New York 1. Main Survey Questions Highlighted parts correspond

More information

Relation between Grape Wine Quality and Related Physicochemical Indexes

Relation between Grape Wine Quality and Related Physicochemical Indexes Research Journal of Applied Sciences, Engineering and Technology 5(4): 557-5577, 013 ISSN: 040-7459; e-issn: 040-7467 Maxwell Scientific Organization, 013 Submitted: October 1, 01 Accepted: December 03,

More information

Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN certified safety function (spring down)

Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN certified safety function (spring down) Modulating controlled actuators AME 10, AME 20, AME 30 AME 13, AME 23, AME 33 - with EN 14597 certified safety function (spring down) Description AME 10 AME 13 AME 20, AME 30 AME 23, AME 33 The actuators

More information

TRTP and TRTA in BDS Application per CDISC ADaM Standards Maggie Ci Jiang, Teva Pharmaceuticals, West Chester, PA

TRTP and TRTA in BDS Application per CDISC ADaM Standards Maggie Ci Jiang, Teva Pharmaceuticals, West Chester, PA PharmaSUG 2016 - Paper DS14 TRTP and TRTA in BDS Application per CDISC ADaM Standards Maggie Ci Jiang, Teva Pharmaceuticals, West Chester, PA ABSTRACT CDSIC ADaM Implementation Guide v1.1 (IG) [1]. has

More information

Algorithms in Percolation. Problem: how to identify and measure cluster size distribution

Algorithms in Percolation. Problem: how to identify and measure cluster size distribution Algorithms in Percolation Problem: how to identify and measure cluster size distribution 1 Single-Cluster growth Leath-Alexandrowicz method Paul Leath Rutgers University P. L. Leath, Phys. Rev. B 14, 5046

More information

Composition and Value of Loin Primals

Composition and Value of Loin Primals Composition and Value of Loin Primals Tom J. Baas, Ph.D. Iowa State University Pork producers today are interested in adding value over and above traditional commodity markets to the hogs they produce

More information

tutorial_archetypes_prototypes_siqd_ensembles.r michael Sat Oct 29 21:38:

tutorial_archetypes_prototypes_siqd_ensembles.r michael Sat Oct 29 21:38: Electronic Supplementary Material (ESI) for Nanoscale. This journal is The Royal Society of Chemistry 2016 tutorial_archetypes_prototypes_siqd_ensembles.r michael Sat Oct 29 21:38:31 2016 #R script to

More information

Selection bias in innovation studies: A simple test

Selection bias in innovation studies: A simple test Selection bias in innovation studies: A simple test Work in progress Gaétan de Rassenfosse University of Melbourne (MIAESR and IPRIA), Australia. Annelies Wastyn KULeuven, Belgium. IPTS Workshop, June

More information

Not to be published - available as an online Appendix only! 1.1 Discussion of Effects of Control Variables

Not to be published - available as an online Appendix only! 1.1 Discussion of Effects of Control Variables 1 Appendix Not to be published - available as an online Appendix only! 1.1 Discussion of Effects of Control Variables Table 1 in the main text includes a number of additional control variables. We find

More information

To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016

To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016 To: Professor Roger Bohn & Hyeonsu Kang Subject: Big Data, Assignment April 13th. From: xxxx (anonymized) Date: 4/11/2016 Data Preparation: 1. Separate trany variable into Manual which takes value of 1

More information

Predicting Fruitset Model Philip Schwallier, Amy Irish- Brown, Michigan State University

Predicting Fruitset Model Philip Schwallier, Amy Irish- Brown, Michigan State University Predicting Fruitset Model Philip Schwallier, Amy Irish- Brown, Michigan State University Chemical thinning is the most critical annual apple orchard practice. Yet chemical thinning is the most stressful

More information

Internet Appendix for Does Stock Liquidity Enhance or Impede Firm Innovation? *

Internet Appendix for Does Stock Liquidity Enhance or Impede Firm Innovation? * Internet Appendix for Does Stock Liquidity Enhance or Impede Firm Innovation? * This Internet Appendix provides supplemental analyses and robustness tests to the main results presented in Does Stock Liquidity

More information

Predicting Wine Quality

Predicting Wine Quality March 8, 2016 Ilker Karakasoglu Predicting Wine Quality Problem description: You have been retained as a statistical consultant for a wine co-operative, and have been asked to analyze these data. Each

More information

Acetic acid dissociates immediately in solution. Reaction A does not react further following the sample taken at the end of

Acetic acid dissociates immediately in solution. Reaction A does not react further following the sample taken at the end of SUPPLEMENTAL Table S1. Assumptions made during fitting of the reaction model in Dynochem. ID Assumption A1 Acetic acid dissociates immediately in solution. A2 Reaction A does not react further following

More information

The Effects of Presidential Politics on CEO Compensation

The Effects of Presidential Politics on CEO Compensation The Effects of Presidential Politics on CEO Compensation Humnath Panta, Ph.D. Assistant Professor and Finance Program Director Brenau University, Gainesville, GA 30501 Salil K. Sarkar, Ph.D., CFA Coordinator,

More information

SA Winegrape Crush Survey Regional Summary Report 2017 South Australia - other

SA Winegrape Crush Survey Regional Summary Report 2017 South Australia - other SA Winegrape Crush Survey Regional Summary Report 2017 South Australia - other Vintage overview South Australia (other) includes the GI region of Southern Flinders Ranges, the Peninsulas zone, and the

More information

A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation

A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation A Comparison of Approximate Bayesian Bootstrap and Weighted Sequential Hot Deck for Multiple Imputation Darryl V. Creel RTI International 1 RTI International is a trade name of Research Triangle Institute.

More information

Increasing the efficiency of forecasting winegrape yield by using information on spatial variability to select sample sites

Increasing the efficiency of forecasting winegrape yield by using information on spatial variability to select sample sites Increasing the efficiency of forecasting winegrape yield by using information on spatial variability to select sample sites Andrew Hall, Research Fellow, Spatial Science Leo Quirk, Viticulture Extension

More information

Long term impacts of facilitating temporary contracts: A comparative analysis of Italy and Spain using birth cohorts

Long term impacts of facilitating temporary contracts: A comparative analysis of Italy and Spain using birth cohorts Long term impacts of facilitating temporary contracts: A comparative analysis of Italy and Spain using birth cohorts Miguel Á. Malo (University of Salamanca, Spain) Dario Sciulli (University of Chietti

More information

Estimating and Adjusting Crop Weight in Finger Lakes Vineyards

Estimating and Adjusting Crop Weight in Finger Lakes Vineyards Estimating and Adjusting Crop Weight in Finger Lakes yards (Material handed out at a Finger Lakes grower twilight meeting July, 2001) Copyright 2001 Robert Pool Reviewed by Jodi Creasap Gee, 2011 Why estimate

More information

BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS

BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS BORDEAUX WINE VINTAGE QUALITY AND THE WEATHER ECONOMETRIC ANALYSIS WINE PRICES OVER VINTAGES DATA The data sheet contains market prices for a collection of 13 high quality Bordeaux wines (not including

More information

The R&D-patent relationship: An industry perspective

The R&D-patent relationship: An industry perspective Université Libre de Bruxelles (ULB) Solvay Brussels School of Economics and Management (SBS-EM) European Center for Advanced Research in Economics and Statistics (ECARES) The R&D-patent relationship: An

More information

Missing Data Methods (Part I): Multiple Imputation. Advanced Multivariate Statistical Methods Workshop

Missing Data Methods (Part I): Multiple Imputation. Advanced Multivariate Statistical Methods Workshop Missing Data Methods (Part I): Multiple Imputation Advanced Multivariate Statistical Methods Workshop University of Georgia: Institute for Interdisciplinary Research in Education and Human Development

More information

Ex-Ante Analysis of the Demand for new value added pulse products: A

Ex-Ante Analysis of the Demand for new value added pulse products: A Ex-Ante Analysis of the Demand for new value added pulse products: A case of Precooked Beans in Uganda Paul Aseete, Enid Katungi, Jackie Bonabana, Michael Ugen and Eliud Birachi Background Common bean

More information

Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform

Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform Online Appendix to Voluntary Disclosure and Information Asymmetry: Evidence from the 2005 Securities Offering Reform This document contains several additional results that are untabulated but referenced

More information

Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent)

Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent) Appendix Table A.1: Use of funds by frequency of ROSCA meetings in 9 research sites (Note multiple answers are allowed per respondent) Daily Weekly Every 2 weeks Monthly Every 3 months Every 6 months Total

More information

Incremental Record Linkage. Anja Gruenheid!! Xin Luna Dong!!! Divesh Srivastava

Incremental Record Linkage. Anja Gruenheid!! Xin Luna Dong!!! Divesh Srivastava Incremental Record Linkage Anja Gruenheid!! Xin Luna Dong!!! Divesh Srivastava Introduction What is record linkage?!!! The task of linking records that refer to the same!!!! real-world entity.! Why do

More information

Online Appendix to The Effect of Liquidity on Governance

Online Appendix to The Effect of Liquidity on Governance Online Appendix to The Effect of Liquidity on Governance Table OA1: Conditional correlations of liquidity for the subsample of firms targeted by hedge funds This table reports Pearson and Spearman correlations

More information

Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications. Web Appendix

Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications. Web Appendix Credit Supply and Monetary Policy: Identifying the Bank Balance-Sheet Channel with Loan Applications By GABRIEL JIMÉNEZ, STEVEN ONGENA, JOSÉ-LUIS PEYDRÓ, AND JESÚS SAURINA Web Appendix APPENDIX A -- NUMBER

More information

Temperature effect on pollen germination/tube growth in apple pistils

Temperature effect on pollen germination/tube growth in apple pistils FINAL PROJECT REPORT Project Title: Temperature effect on pollen germination/tube growth in apple pistils PI: Dr. Keith Yoder Co-PI(): Dr. Rongcai Yuan Organization: Va. Tech Organization: Va. Tech Telephone/email:

More information

The Financing and Growth of Firms in China and India: Evidence from Capital Markets

The Financing and Growth of Firms in China and India: Evidence from Capital Markets The Financing and Growth of Firms in China and India: Evidence from Capital Markets Tatiana Didier Sergio Schmukler Dec. 12-13, 2012 NIPFP-DEA-JIMF Conference Macro and Financial Challenges of Emerging

More information

Master planning in semiconductor manufacturing exercise

Master planning in semiconductor manufacturing exercise Master planning in semiconductor manufacturing exercise Outline of the LP model for master planning We consider a semiconductor manufacturer with a three-stage production: Wafer fab, assembly, testing

More information

Emerging Local Food Systems in the Caribbean and Southern USA July 6, 2014

Emerging Local Food Systems in the Caribbean and Southern USA July 6, 2014 Consumers attitudes toward consumption of two different types of juice beverages based on country of origin (local vs. imported) Presented at Emerging Local Food Systems in the Caribbean and Southern USA

More information

Appendix A. Table A1: Marginal effects and elasticities on the export probability

Appendix A. Table A1: Marginal effects and elasticities on the export probability Appendix A Table A1: Marginal effects and elasticities on the export probability Variable PROP [1] PROP [2] PROP [3] PROP [4] Export Probability 0.207 0.148 0.206 0.141 Marg. Eff. Elasticity Marg. Eff.

More information

Valuation in the Life Settlements Market

Valuation in the Life Settlements Market Valuation in the Life Settlements Market New Empirical Evidence Jiahua (Java) Xu 1 1 Institute of Insurance Economics University of St.Gallen Western Risk and Insurance Association 2018 Annual Meeting

More information

Algebra 2: Sample Items

Algebra 2: Sample Items ETO High School Mathematics 2014 2015 Algebra 2: Sample Items Candy Cup Candy Cup Directions: Each group of 3 or 4 students will receive a whiteboard, marker, paper towel for an eraser, and plastic cup.

More information

Building Reliable Activity Models Using Hierarchical Shrinkage and Mined Ontology

Building Reliable Activity Models Using Hierarchical Shrinkage and Mined Ontology Building Reliable Activity Models Using Hierarchical Shrinkage and Mined Ontology Emmanuel Munguia Tapia 1, Tanzeem Choudhury and Matthai Philipose 2 1 Massachusetts Institute of Technology 2 Intel Research

More information

Internet Appendix. For. Birds of a feather: Value implications of political alignment between top management and directors

Internet Appendix. For. Birds of a feather: Value implications of political alignment between top management and directors Internet Appendix For Birds of a feather: Value implications of political alignment between top management and directors Jongsub Lee *, Kwang J. Lee, and Nandu J. Nagarajan This Internet Appendix reports

More information

Improved Inverse Response of Boiler Drum Level using Fuzzy Self Adaptive PID Controller

Improved Inverse Response of Boiler Drum Level using Fuzzy Self Adaptive PID Controller Improved Inverse Response of Boiler Drum Level using Fuzzy Self Adaptive PID Controller C.B. Kadu 1, D.V. Sakhare 2 1 Associate Professor, Instrumentation & Control ngineering, Pravara Rural ngineering

More information

F&N 453 Project Written Report. TITLE: Effect of wheat germ substituted for 10%, 20%, and 30% of all purpose flour by

F&N 453 Project Written Report. TITLE: Effect of wheat germ substituted for 10%, 20%, and 30% of all purpose flour by F&N 453 Project Written Report Katharine Howe TITLE: Effect of wheat substituted for 10%, 20%, and 30% of all purpose flour by volume in a basic yellow cake. ABSTRACT Wheat is a component of wheat whole

More information

Directions for Menu Worksheet. General Information:

Directions for Menu Worksheet. General Information: Directions for Menu Worksheet Welcome to the FNS Menu Worksheet, a tool designed to assist School Food Authorities (SFAs) in demonstrating that each of the menus meets the new meal pattern for the National

More information

INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS. Subject CS1B Actuarial Statistics

INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS. Subject CS1B Actuarial Statistics INSTITUTE AND FACULTY OF ACTUARIES CURRICULUM 2019 SPECIMEN SOLUTIONS Subject CS1B Actuarial Statistics Question 1 (i) # Data entry before

More information

Imputation of multivariate continuous data with non-ignorable missingness

Imputation of multivariate continuous data with non-ignorable missingness Imputation of multivariate continuous data with non-ignorable missingness Thais Paiva Jerry Reiter Department of Statistical Science Duke University NCRN Meeting Spring 2014 May 23, 2014 Thais Paiva, Jerry

More information

Learning Connectivity Networks from High-Dimensional Point Processes

Learning Connectivity Networks from High-Dimensional Point Processes Learning Connectivity Networks from High-Dimensional Point Processes Ali Shojaie Department of Biostatistics University of Washington faculty.washington.edu/ashojaie Feb 21st 2018 Motivation: Unlocking

More information

The Effect of Almond Flour on Texture and Palatability of Chocolate Chip Cookies. Joclyn Wallace FN 453 Dr. Daniel

The Effect of Almond Flour on Texture and Palatability of Chocolate Chip Cookies. Joclyn Wallace FN 453 Dr. Daniel The Effect of Almond Flour on Texture and Palatability of Chocolate Chip Cookies Joclyn Wallace FN 453 Dr. Daniel 11-22-06 The Effect of Almond Flour on Texture and Palatability of Chocolate Chip Cookies

More information

COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven

COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven Pertanika 13(1), 67-72 (10) COMMUNICATION II Moisture Determination of Cocoa Beans by Microwave Oven ABSTRAK Analisa statistik telah dijalankan antara kaedah menggunakan ketuhar mikrogelumbang dan kaedah

More information