Discriminant Analysis: LDA, QDA, k-nn, Bayes, PLSDA, cart, Random forests

Size: px
Start display at page:

Download "Discriminant Analysis: LDA, QDA, k-nn, Bayes, PLSDA, cart, Random forests"

Transcription

1 enote 9 1 enote 9 Diriminant Analyi: LDA, QDA, k-nn, Baye, PLSDA, art, Random foret

2 enote 9 INDHOLD 2 Indhold 9 Diriminant Analyi: LDA, QDA, k-nn, Baye, PLSDA, art, Random foret Reading material LDA, QDA, k-nn, Baye Claifiation tree (CART) and random foret Example: Iri data Linear Diriminant Analyi, LDA Quadrati Diriminant Analyi, QDA Prediting NEW data Baye method k-nearet neighbourgh PLS-DA Random foret foretfloor Exerie Reading material LDA, QDA, k-nn, Baye Read in the Varmuza book: (not oering CARTS and random foret) Setion 5.1, Intro, 2.5 page Setion 5.2, Linear Method, 12 page Setion 5.3.3, Nearet Neighbourg (k-nn), 3 page Setion 5.7, Ealuation of laifiation, 3 page

3 enote READING MATERIAL 3 Alternatiely read in the Wehren book: (not oering CARTS and random foret) 7.1 Diriminant Analyi Linear Diriminant Analyi Croalidation Fiher LDA Quadrati Diriminant Analyi Model-Baed Diriminant Analyi Regularized Form of Diriminant Analyi Nearet-Neighbour Approahe Dirimination with Fat Data Matrie PCDA PLSDA Claifiation tree (CART) and random foret Read in the Varmuza book about laifiation (and regreion) tree: Setion 5.4 Claifiation Tree Setion Claifiation Tree (Setion Regreion Tree) Read in the Wehren book: 7.3 Tree-Baed Approahe Integrated Modelling and Validation 195 (9.7.1 Bagging 196) Random Foret 197 (9.7.3 Booting 202)

4 enote EXAMPLE: IRIS DATA Example: Iri data # we ue the iri data: data(iri3) #library(mass) Iri <- data.frame(rbind(iri3[,,1], iri3[,,2], iri3[,,3]), Sp = rep(("","",""), rep(50,3))) # We make a tet and training data: et.eed(4897) train <- ample(1:150, 75) tet <- (1:150)[-train] Iri_train <- Iri[train,] Iri_tet <- Iri[tet,] # Ditribution in three lae in training data: table(iri_train$sp) Linear Diriminant Analyi, LDA We ue the lda funtion from the MASS pakage: # PART 1: LDA library(mass) lda_train_loo <- lda(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., Iri_train, prior = (1, 1, 1)/3, CV = TRUE) The Speie fator ariable i expreed a the repone in a uual model expreion with the four meaurement ariable a the x. The CV=TRUE option hoie perform full LOO ro alidation. The prior option work a:

5 enote EXAMPLE: IRIS DATA 5 the prior probabilitie of la memberhip. If unpeified, the la proportion for the training et are ued. If preent, the probabilitie hould be peified in the order of the fator leel. Firt we mut ae the auray of the predition baed on the ro alidation error, whih i quantified imply a relatie frequenie of errornou la predition, either in total or detailed on the lae: # Ae the auray of the predition # perent orret for eah ategory: t <- table(iri_train$sp, lda_train_loo$la) diag(prop.table(t, 1)) # total perent orret um(diag(prop.table(t))) [1] So the oeral CV baed error rate i = 2.7%. Som nie plotting only work without the CV-tuff uing the klar-pakage: library(klar) partimat(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri_train, method = "lda", prior=(1, 1, 1)/3)

6 enote EXAMPLE: IRIS DATA Sepal.W. Sepal.L. app. error rate: Petal.L. Sepal.L. app. error rate: Petal.L. Sepal.W. app. error rate: Petal.W. Sepal.L. app. error rate: Petal.W. Sepal.W. app. error rate: Petal.W. Petal.L. app. error rate: 0.04 Partition Plot Quadrati Diriminant Analyi, QDA It goe ery muh like aboe: # PART 2: QDA # Mot tuff from LDA an be reued: qda_train_loo <- qda(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., Iri_train, prior = (1, 1, 1)/3, CV = TRUE) # Ae the auray of the predition # perent orret for eah ategory: t <- table(iri_train$sp, qda_train_loo$la) t

7 enote EXAMPLE: IRIS DATA diag(prop.table(t, 1)) # total perent orret um(diag(prop.table(t))) [1] 0.96 For thi example the QDA perform lightly wore than the LDA. partimat(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri_train, method = "qda", prior = (1, 1, 1)/3)

8 enote EXAMPLE: IRIS DATA Sepal.W. Sepal.L. app. error rate: Petal.L. Sepal.L. app. error rate: Petal.L. Sepal.W. app. error rate: Petal.W. Sepal.L. app. error rate: Petal.W. Sepal.W. app. error rate: Petal.W. Petal.L. app. error rate: 0.04 Partition Plot Prediting NEW data # And now prediting NEW data: predit(qda_train, Iri_tet)$la Error in predit(qda train, Iri tet): objet qda train not found # Find onfuion table: t <- table(iri_tet$sp, predit(qda_train, Iri_tet)$la) Error in predit(qda train, Iri tet): objet qda train not found t

9 enote EXAMPLE: IRIS DATA diag(prop.table(t, 1)) # total perent orret um(diag(prop.table(t))) [1] Baye method We an fit a denity to the obered data and ue that intead of the normal ditribution impliitly ued in LDA: # Part 3: (Naie) Baye method # With "uekernel=true" it fit a denity to the obered data and ue that # intead of the normal ditribution # Let explore the reult firt: # (Can take a while dur to the fitting of denitie) partimat(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri_train, method = "naiebaye", prior=(1, 1, 1)/3, uekernel = TRUE)

10 enote EXAMPLE: IRIS DATA Sepal.W. Sepal.L. app. error rate: Petal.L. Sepal.L. app. error rate: Petal.L. Sepal.W. app. error rate: Petal.W. Sepal.L. app. error rate: Petal.W. Sepal.W. app. error rate: Petal.W. Petal.L. app. error rate: 0.04 Partition Plot baye_fit <- upprewarning(naiebaye(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri_train, method = "naiebaye", prior = (1, 1, 1)/3, uekernel = TRUE)) par(mfrow = (2, 2)) plot(baye_fit)

11 enote EXAMPLE: IRIS DATA 11 Naie Baye Plot Naie Baye Plot Denity Denity Denity Sepal.L. Naie Baye Plot Denity Sepal.W. Naie Baye Plot Petal.L. Petal.W. # And now prediting NEW data: bayepred <- predit(baye_fit, Iri_tet)$la # Find onfuion table: t <- table(iri_tet$sp, bayepred) t bayepred diag(prop.table(t, 1))

12 enote EXAMPLE: IRIS DATA 12 # total perent orret um(diag(prop.table(t))) [1] k-nearet neighbourgh # PART 4: k-nearet neighbourgh: # Exploratie plot WARNING: THIS may take ome time to produe!! partimat(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri[train,], method = "knn", kn = 3) Sepal.W. Sepal.L. app. error rate: Petal.L. Sepal.L. app. error rate: Petal.L. Sepal.W. app. error rate: Petal.W. Sepal.L. app. error rate: Petal.W. Sepal.W. app. error rate: Petal.W. Petal.L. app. error rate: 0.04 Partition Plot

13 enote EXAMPLE: IRIS DATA 13 knn_fit_5 <- knn(sp ~ Sepal.L. + Sepal.W. + Petal.L. + Petal.W., data = Iri_train, method = "knn", kn = 5) # And now prediting NEW data: knn_5_pred <- predit(knn_fit_5, Iri_tet)$la # Find onfuion table: t <- table(iri_tet$sp, knn_5_pred) t knn_5_pred diag(prop.table(t, 1)) # total perent orret um(diag(prop.table(t))) [1] PLS-DA # PART 5: PLS-DA # We hae to ue the "uual" PLS-funtion # Define the repone etor (2 lae) OR matrix (>2) lae:

14 enote EXAMPLE: IRIS DATA 14 # Let try with K=2: Group 1:, Group -1: and Iri_train$Y <- -1 Iri_train$Y[Iri_train$Sp == ""] <- 1 table(iri_train$y) Iri_train$X <- a.matrix(iri_train[, 1:4]) # From here ue tandard PLS1 predition, e.g.: library(pl) # Pl: mod_pl <- plr(y ~X, nomp = 4, data =Iri_train, alidation = "LOO", ale = TRUE, jakknife = TRUE) # Initial et of plot: par(mfrow = (2, 2)) plot(mod_pl, label = rowname(iri_train), whih = "alidation") plot(mod_pl, "alidation", etimate = ("train", "CV"), legendpo = "topright") plot(mod_pl, "alidation", etimate = ("train", "CV"), al.type = "R2", legendpo = "bottomright") pl::oreplot(mod_pl, label = Iri_train$Sp)

15 enote EXAMPLE: IRIS DATA 15 predited Y, 4 omp, alidation RMSEP Y train CV R meaured Y train CV Comp 2 (25 %) number of omponent number of omponent Comp 1 (71 %) Be arefull about interpretation due to the binary etting You hould do a CV baed onfuion table for eah omponent, really: pred <- array(dim = (length(iri_train[, 1]), 4)) for (i in 1:4) pred[, i] <- predit(mod_pl, nomp = i) pred[pred<0] <- -1 pred[pred>0] <- 1 # Look at the reult from eah of the omponent: for (i in 1:4) { t <- table(iri_train$y, pred[,1]) CV_error <- 1-um(diag(prop.table(t))) print(cv_error) } [1] 0

16 enote EXAMPLE: IRIS DATA 16 [1] 0 [1] 0 [1] 0 The predition of new data would be handled imilarly (not hown). # WHAT if in thi ae K=3 lae: # Look at Varmuza, Se K=3 Iri_train$Y=matrix(rep(1,length(Iri_train[,1])*K),nol=K) Iri_train$Y[Iri_train$Sp!="",1]=-1 Iri_train$Y[Iri_train$Sp!="",2]=-1 Iri_train$Y[Iri_train$Sp!="",3]=-1 mod_pl <- plr(y ~ X, nomp = 4, data = Iri_train, alidation="loo", ale = TRUE, jakknife = TRUE) # Initial et of plot: par(mfrow=(1, 1)) pl::oreplot(mod_pl, label = Iri_train$Sp)

17 enote EXAMPLE: IRIS DATA Comp 1 (72 %) Comp 2 (25 %) plot(mod_pl, label = rowname(iri_train), whih = "alidation")

18 enote EXAMPLE: IRIS DATA 18 Y1, 4 omp, alidation Y2, 4 omp, alidation Y3, 4 omp, alidation predited meaured plot(mod_pl, "alidation", etimate = ("train", "CV"), legendpo = "topright")

19 enote EXAMPLE: IRIS DATA 19 Y1 Y2 Y3 train CV train CV train CV RMSEP number of omponent plot(mod_pl, "alidation", etimate = ("train", "CV"), al.type = "R2", legendpo = "bottomright")

20 enote EXAMPLE: IRIS DATA 20 Y1 Y2 Y3 R train CV train CV train CV number of omponent # Predition from PLS need to be tranformed to atual laifiation: # Selet the larget one: pred <- array(dim = (length(iri_train[, 1]), 4)) for (i in 1:4) pred[,i]<- apply(predit(mod_pl, nomp = i), 1, whih.max) pred2 <- array(dim = (length(iri_train[, 1]), 4)) pred2[pred==1] <- "" pred2[pred==2] <- "" pred2[pred==3] <- "" # Look at the reult from eah of the omponent: for (i in 1:4) { t <- table(iri_train$sp, pred2[, i]) CV_error <- 1 - um(diag(prop.table(t))) print(cv_error) }

21 enote EXAMPLE: IRIS DATA 21 [1] 0.96 [1] 0.24 [1] 0.2 [1] Random foret Wellome to example of randomforet and foretfloor. Random foret i one of many deiion tree enemble method, whih an be ued for non-linear uperied learning. In R, the tandard ran pakage i randomforet and the main funtion i alo alled randomforet. Randomforet an be een a a blak-box algorithm whih output a model-fit(the foret) when inputted a training data et and a et of paremter. The foret, an take an input of feature and output predition. Eah diiion tree in the foret will make a predition, and the ote by eah tree will be ombined in an enemble. The predited repone i either a number/alar (regreion model, mean of eah tree) or one label out of K lae (laifiation, majority ote) or a etor of K length with peudo probability of any K la memberhip(laifiation, pluraliti ote). library(randomforet) Warning: pakke randomforet ble bygget under R erion randomforet Type rfnew() to ee new feature/hange/bug fixe. #a imple dataet of normal ditributed feature ob = 2000 ar = 6 X = data.frame(repliate(ar,rnorm(ob,mean=0,d=1))) #the target/repone/y depend of X by ome unknown hidden funtion hidden.funtion = funtion(x,snr=4) { yignal <<- with(x,.5 * X1^2 + in(x2*pi) + X3 * X4) #y = x1^2 + in(x2) + x3 * x4 ynoie = rnorm(dim(x)[1],mean=0,d=d(yignal)/snr) at("atual ignal to noie ratio, SNR: \n", round(d(yignal)/d(ynoie),2)) y = yignal + ynoie

22 enote EXAMPLE: IRIS DATA } y = hidden.funtion(x) atual ignal to noie ratio, SNR: 4.06 #atter plot of X y relation plot(data.frame(y,x[,1:4]),ol="# ") y 2 0 X X2 2 4 X3 0 X #no noteworthy linear relationhip print(or(x,y)) [,1] X X

23 enote EXAMPLE: IRIS DATA 23 X X X X #RF i the foret_objet, randomforet i the algorithm, X & y the training data RF = randomforet(x=x,y=y, importane=true, #extra diagnoti keep.inbag=true, #trak of boottrap proe ntree=500, #how many tree replae=false) #boottrap with replaement? print(rf) Call: randomforet(x = X, y = y, ntree = 500, replae = FALSE, importane = TRUE, Type of random foret: regreion Number of tree: 500 No. of ariable tried at eah plit: 2 keep Mean of quared reidual: % Var explained: The modelfit print ome information. Thi i regreion random foret, 500 tree were grown and in eah plit 2 ariable we tried (mtry=ar/3). Next the model automatially doe out-of-bag ro-alidation (OOB-CV). The reult obtained from OOB-CV i imilar to 5-fold ro alidation. But to perform an atual 5-fold-CV, 5 random foret mut be trained. That would ompute 5 time lower. The RF objet i a lit of la randomforet, whih ontain the foret and alot of pre-made diagnoti. Let try undertand the mot dentral tatiti. #RF predited i the OOB-CV predition par(mfrow=(1,2)) plot(rf$predited,y, ol="# ", main="predition plot", xlab="predited repone", ylab="atual repone") abline(lm(y~yhat,data.frame(y=rf$y,yhat=rf$predited)))

24 enote EXAMPLE: IRIS DATA 24 #thi performane mut be een in the light of the ignal-to-noie-ratio, SNR plot(y,yignal, ol="# ", main="ignal and noie plot", xlab="repone + noie", ylab="noie-le repone") predition plot ignal and noie plot atual repone noie le repone predited repone repone + noie at("explained ariane, (peudo R 2 ) = 1- SSmodel/SStotal = \n", round(1-mean((rf$pred-y)^2)/ar(y),3)) explained ariane, (peudo R 2 ) = 1- SSmodel/SStotal = at("model orrelation, (Pearon R 2 ) = ",round(or(rf$pred,y)^2,2)) model orrelation, (Pearon R 2 ) = 0.69

25 enote EXAMPLE: IRIS DATA 25 at("ignal orrelation, (Pearon R 2 ) = ",round(or(y,yignal)^2,2)) ignal orrelation, (Pearon R 2 ) = 0.94 The random foret will neer make a perfet fit. But if the number ample and tree goe toward a uffiient large number, the model fit will in pratie be good enough. If the true model funtion ha a omplex urature, ignal-to-noie leel i low and relatiely few ample i ued for training (e.g. 100), the model fit will be highly biaed (omplex urature i inhibited) in order to retain ome tability/robutne. RF$rq ontain a etor of ntree element. Eah element i the OOB-CV (peudo R 2 ) if only thi many tree had been grown. Often it i enough to grow 50 tree. 10 Tree i rarely good enough. In theory predition performane will inreae aymtoti to a maximum leel. In pratie predition performane an dereae, but uh inident are mall, random and annot be reprodued. More tree i neer wore, only wate of time. par(mfrow=(1,1)) plot(rf$rq,type="l",log="x", ylab="predition performane, peudo R 2 ", xlab="n tree ued")

26 enote EXAMPLE: IRIS DATA 26 predition performane, peudo R² n tree ued The RF objet ontain a matrix alled importane(rf$importane). Firt olumn (when importane=true) i ariable permutation importane (VI). VI i a alue for eah ariable. It i the hange of OOB-CV mean quare error% if thi ariable wa permuted(huffled) after the model wa trained. Permuting a ariable make it random and with no ueful information. If the model deteriorated the mot by permuting a gien ariable, thi ariable i the mot important ariable. Thu without trying to undertand the model itelf, it i poible to ruin the ariable and meaure how muh CV performane deteriorate. Sometime i the purpoe of random foret modeling not the predition itelf, but to obtain the ariable importane. E.g. for eleting gene aoiated with aner, one an ue ariable importane to hooe important gene for further examiniation. ##ariable importane RF$importane %InMSE InNodePurity X e X e

27 enote EXAMPLE: IRIS DATA 27 X e X e X e X e #hort ut to plot ariable importane arimpplot(rf) RF X1 X2 X2 X1 X4 X3 X3 X4 X6 X6 X5 X %InMSE InNodePurity Notie ariable 5 and 6 are rather unimportant. Gini-importane, the eond importane term, i ompletely inferrior, and hould not be ued. The RF objet an be ued to make new predition. #let try to predit a tet et of 800 ample X2 = data.frame(repliate(ar,rnorm(800))) true.y = hidden.funtion(x2)

28 enote EXAMPLE: IRIS DATA 28 atual ignal to noie ratio, SNR: 4.12 pred.y = predit(rf,x2) par(mfrow=(1,1)) plot(pred.y,true.y, main= "tet-et predition", xlab= "predit repone", ylab= "true repone", ol=rgb(0,0,ab(pred.y/max(pred.y)),alpha=.9)) abline(lm(true.y~pred.y,data.frame(true.y,pred.y))) tet et predition true repone predit repone

29 enote EXAMPLE: IRIS DATA foretfloor Random foret i regularly only ued to either ariable eletion with ariable importane or to build a blak-box foreat mahine. The pakage foretfloor an be ued to explore and iulize the urature of a RF model-fit. The urature of multiariate model are high dimenional and annot be plotted properly. Multi linear regreion i fairly eay a it only omprie om oeffiient deribing a hyper-plane. For non-linear model, the uer often hae not the lightet idea of the atual urature of the model. -If a non-linear model predit a gien problem well, it urature might inpire and elaborate the ientit undertanding of the problem. #get pakge from rforge. Maybe additional pakage uh trimtree, mlbenh, rgl and #mut be intalled firt. #intall.pakage("foretfloor", repo=" library(foretfloor, warn.onflit=false, quietly = TRUE) #the funtion foretfloor output a foretfloor-objet, here alled ff ff = foretfloor(rf,x) print(ff) thi i a foretfloor( x ) objet thi objet an be plotted in 2D with plot(x), ee help(plot.foretfloor) thi objet an be plotted in 3D with how3d(x), ee help(how3d) x ontain following internal element: FCmatrix imp_ind importane X Y #ff an be plotted in different way. A our data hae ix dimenion we annot #plot eerything at one. Let tart with one-way foretfloor plot plot(ff)

30 enote EXAMPLE: IRIS DATA X X X X X X5 We an ee that the ontribution from ariable X1 and X2 to the repone look a lot like X 2 and in(x). The y-axi i alled feature ontribution(f). Eah ample ha one feature ontribution for eah ariable, thu eah ample i omewhere in eah figure. The x-axi i the alue of any ample by a gien ariable/feature. If ample i, at one time wa plaed in a node with repone mean of 1.0 and wa plit by ariable j, and ent to a new node of repone mean -4.2, then ample i experiened a loal inrement of -5.2 by ariable j. A feature ontribution i the um of tep (loal inrement) one ample took by a gien ariable through the foret diided by number of tree. Feature ontribution are tored in matrix, alled F or FCmatrix, of ame ize a X. Thu one feature ontribution for eah ombination of ariable and ample. F denote a OOB- CV erion feature ontribution only ummed oer thoe tree where the i th ample i OOB dieded with how may time i th ample wa OOB. F i more robut than F. The following equation applie, ỹ i = j j=i F ij + y i Thi mean that any gien OOB-CV predition ỹ i i equal to the um of it feature on-

31 enote EXAMPLE: IRIS DATA 31 tribution (one for eah ariable in the model) plu the i it boottrap mean. The boot trap mean i for any pratial onern ery ery loe to grand mean, mean(y). It deiate lightly from grand mean a eah tree tart out with lightly different boottrap mean and that eah ample i OOB in different tree. The equation aboe tate in pratie, that any predition i equal to the um of the tep taking in the proe plu the tarting point, the grand mean. #following line demontrate the aboe equation #thi part an be kipped... #thi i the tarting predition of eah tree tree.boottrap.mean = apply(rf$inbag,2,funtion(x) um(x*y/um(x))) #thi i the indiidual OOB boottrap.mean for any oberation y.boottrap.mean = apply(rf$inbag,1,funtion(x) { um((x==0) * tree.boottrap.mean)/um(x==0) }) #OOB predition = FC.rowum + boottrap.mean yhat = apply(ff$fcmatrix,1,um) + y.boottrap.mean #yhat and RF predited are almot the ame, only limited by double preiion. ##plot(yhat-rf predited) #try plot thi Next ariable 3 and 4 do not look well explained in the one-way foretfloor plot. A x3 and x4 interat, neither ariable alone an explain it influene on the predited repone. We an ue a olour-gradient to add another dimenion to the plot. Firt we need to learn the funtion fol(). #fol output a olouretor a funtion of a matrix or foretfloor objet #firt input, what to olour by, 2nd input, what olumn to ue par(mfrow=(2,2)) pair(x[,1:3],ol=fol(x,ol=2),main="ingle ariable gradient, \n X2")

32 enote EXAMPLE: IRIS DATA ingle ariable gradient, X X1 X X2 0 pair(x[,1:3],ol=fol(x,ol=(1:2)),main="double ariable gradient, \n X1 & X2") double ariable gradient, X1 & X X1 X X2 0 pair(x[,1:3],ol=fol(x,ol=(1:3)),main="triple ariable gradient, \n X1 & X2 & X3"

33 enote EXAMPLE: IRIS DATA triple ariable gradient, X1 & X2 & X X1 X X2 0 pair(x[,1:5],ol=fol(x,ol=(1:5)),main="multi ariable gradient, \n PCA of X1...X5 multi ariable gradient, PCA of X1...X5 3 2 X1 X2 4 X3 X5 3 4 X4 2 #the latter gradient ue PCA to hoe three linear orthogonal gradient, # whih bet an ummarize the high dimenional ariane of X. #A ariable of X i unorrelated, thi i not eay. For ollinear data, # multiariable gradient work great.

34 enote EXAMPLE: IRIS DATA 34 #print fol output olour defined a RGB+alpha(tranpareny) Col = fol(x,ol=(1:3)) print(col[1:5]) [1] "#B " "#0683AA33" "#1FBB5B33" "#B62D1933" "#C4FD3233" #firt two hexidemimal deribe red, then green, then blue, then alpha. # two hexideimal i equal to a 10bae number from 1 to 256 #now we apply a olor gradient along ariable x3 Col = fol(ff,3,order=f) plot(ff,ol=col) X2 X1 X4 partial.ontribution partial.ontribution partial.ontribution phyial.alue X phyial.alue X phyial.alue X5 partial.ontribution partial.ontribution partial.ontribution #one ample will hae ame olour in eery plot #ample with imilar olor hae imilar x3-alue We an ee that a horizontal olour gradient emerge in plot X3, a we hoe to olor by thi axi. Other plot eem randomly olored beaued the arible are unorrela-

35 enote EXERCISES 35 ted and do not interat within the model. But for ariable X4, the ame olur gradient emerge horiontal. Two undertand the olour pattern, it i eaier to ue a 3D-plot how3d_new(ff,3:4,ol=col) #one aweome 3D plot in a external window!! Thu now it i iulized that one-way foretfloor plot X3 and X4 imply are 2D projetion of af 3D addle point urature 9.3 Exerie Exerie 1 Exerie: Wine data Ue the wine data preiouly ued. a) Predit the wine-la uing the different method uggeted. b) Try alo a PCA baed erion of ome of the method. ) What are the reult? Make your own tet- and training data. Apply CV on the training data and predit the tet data. d) By looking at ariou plot (in addition to predition ability) onider whih model eem to be motly appropriate for the data.

36 enote EXERCISES 36 Exerie 2 Exerie: random foret protate train a model to predit protate aner ue ariable importane to identify gene related a) How well an protate aner be explained from gene expreion leel? b) What gene ode for protate aner? ) Thi model ha 100 ample and 6000 ariable. What doe the urature of a ery pare random foret model look like? Exerie 3 Exerie: Random foret exerie 2 - abelone a) How well an a random foret model predit the age of abelone b) What are the main effet (main trend) of the model? (ue one-way foretfloor) ) Are the any large interation beide main-effet and what ariable are impliated? (ue one way foretfloor + fol) d) Deribe the two-way foretfloor plot between hell.weight and hruked.weight: Why would the model ue uh a urature? (ue how3d new and fol)

Classical Univariate Statistics

Classical Univariate Statistics 1 2 Statitial Modelling and Computing Nik Fieller Department of Probability & Statiti Unierity of Sheffield, UK Claial Uniariate Statiti (& Alternatie) Claial tatitial tet and p-alue Simple imulation method

More information

MAT 155: Describing, Exploring, and Comparing Data Page 1 of NotesCh2-3.doc

MAT 155: Describing, Exploring, and Comparing Data Page 1 of NotesCh2-3.doc MAT 155: Decribing, Exploring, and Comparing Data Page 1 of 8 001-oteCh-3.doc ote for Chapter Summarizing and Graphing Data Chapter 3 Decribing, Exploring, and Comparing Data Frequency Ditribution, Graphic

More information

The norm Package. November 15, Title Analysis of multivariate normal datasets with missing values

The norm Package. November 15, Title Analysis of multivariate normal datasets with missing values The norm Package November 15, 2003 Verion 1.0-9 Date 2002/05/06 Title Analyi of multivariate normal dataet with miing value Author Ported to R by Alvaro A. Novo . Original by Joeph

More information

Incorporating Speculative Execution into Scheduling of Control-flow Intensive Behavioral Descriptions

Incorporating Speculative Execution into Scheduling of Control-flow Intensive Behavioral Descriptions Inorporating Speulative Exeution into Sheduling of Control-flow Intenive Behavioral Deription Ganeh Lakhminarayana, Anand Raghunathan, and Niraj K. Jha Dept. of Eletrial Engineering C&C Reearh Laboratorie

More information

Macrohomogenous Li-Ion-Battery Modeling - Strengths and Limitations

Macrohomogenous Li-Ion-Battery Modeling - Strengths and Limitations Marohomogenou Li-Ion-Battery Modeling - Strength and Limitation Marku Lindner Chritian Wieer Adam Opel AG Sope Purpoe of the reearh: undertand and quantify impat of implifiation in marohomogeneou model

More information

SPH3UW Unit 7.1 The Ray Model of Light Page 2 of 5. The accepted value for the speed of light inside a vacuum is c m which we usually

SPH3UW Unit 7.1 The Ray Model of Light Page 2 of 5. The accepted value for the speed of light inside a vacuum is c m which we usually SPH3UW Unit 7. The Ray Model of Light Page of 5 Note Phyi Tool box Ray light trael in traight path alled ray. Index of refration (n) i the ratio of the peed of light () in a auu to the peed of light in

More information

A SIMPLE IMPERATIVE LANGUAGE THE STORE FUNCTION NON-TERMINATING COMMANDS

A SIMPLE IMPERATIVE LANGUAGE THE STORE FUNCTION NON-TERMINATING COMMANDS A SIMPLE IMPERATIVE LANGUAGE Eventually we will preent the emantic of a full-blown language, with declaration, type and looping. However, there are many complication, o we will build up lowly. Our firt

More information

1. Introduction. Abstract

1. Introduction. Abstract Automati Ontology Derivation Uing Clutering for Image Claifiation 1 Latifur Khan and Lei Wang Department of Computer Siene Univerity of Texa at Dalla, TX 75083-0688 Email: [lkhan, leiwang]@utdalla.edu

More information

Exercise 4: Markov Processes, Cellular Automata and Fuzzy Logic

Exercise 4: Markov Processes, Cellular Automata and Fuzzy Logic Exercie 4: Marko rocee, Cellular Automata and Fuzzy Logic Formal Method II, Fall Semeter 203 Solution Sheet Marko rocee Theoretical Exercie. (a) ( point) 0.2 0.7 0.3 tanding 0.25 lying 0.5 0.4 0.2 0.05

More information

ES205 Analysis and Design of Engineering Systems: Lab 1: An Introductory Tutorial: Getting Started with SIMULINK

ES205 Analysis and Design of Engineering Systems: Lab 1: An Introductory Tutorial: Getting Started with SIMULINK ES05 Analyi and Deign of Engineering Sytem: Lab : An Introductory Tutorial: Getting Started with SIMULINK What i SIMULINK? SIMULINK i a oftware package for modeling, imulating, and analyzing dynamic ytem.

More information

Combined Radix-10 and Radix-16 Division Unit

Combined Radix-10 and Radix-16 Division Unit Combined adix- and adix-6 Diviion Unit Tomá ang and Alberto Nannarelli Dept. of Eletrial Engineering and Computer Siene, Univerity of California, Irvine, USA Dept. of Informati & Math. Modelling, Tehnial

More information

Laboratory Exercise 2

Laboratory Exercise 2 Laoratory Exercie Numer and Diplay Thi i an exercie in deigning cominational circuit that can perform inary-to-decimal numer converion and inary-coded-decimal (BCD) addition. Part I We wih to diplay on

More information

Inverse Kinematics 1 1/29/2018

Inverse Kinematics 1 1/29/2018 Invere Kinemati 1 Invere Kinemati 2 given the poe of the end effetor, find the joint variable that produe the end effetor poe for a -joint robot, given find 1 o R T 3 2 1,,,,, q q q q q q RPP + Spherial

More information

Drawing Lines in 2 Dimensions

Drawing Lines in 2 Dimensions Drawing Line in 2 Dimenion Drawing a traight line (or an arc) between two end point when one i limited to dicrete pixel require a bit of thought. Conider the following line uperimpoed on a 2 dimenional

More information

5. Multivariate Methods

5. Multivariate Methods Statitial Modelling & Computing 5. Multiariate Method 5.1 Introdution Earlier hapter hae onidered a ariety of tatitial method for uniariate data, i.e. the repone we are intereted in i a one-dimenional

More information

COURSEWORK 1 FOR INF2B: FINDING THE DISTANCE OF CLOSEST PAIRS OF POINTS ISSUED: 9FEBRUARY 2017

COURSEWORK 1 FOR INF2B: FINDING THE DISTANCE OF CLOSEST PAIRS OF POINTS ISSUED: 9FEBRUARY 2017 COURSEWORK 1 FOR INF2B: FINDING THE DISTANCE OF CLOSEST PAIRS OF POINTS ISSUED: 9FEBRUARY 2017 Submiion Deadline: The ourework onit of two part (of a different nature) relating to one problem. A hown below

More information

Lecture 14: Minimum Spanning Tree I

Lecture 14: Minimum Spanning Tree I COMPSCI 0: Deign and Analyi of Algorithm October 4, 07 Lecture 4: Minimum Spanning Tree I Lecturer: Rong Ge Scribe: Fred Zhang Overview Thi lecture we finih our dicuion of the hortet path problem and introduce

More information

Datum Transformations of NAV420 Reference Frames

Datum Transformations of NAV420 Reference Frames NA4CA Appliation Note Datum ranformation of NA4 Referene Frame Giri Baleri, Sr. Appliation Engineer Crobow ehnology, In. http://www.xbow.om hi appliation note explain how to onvert variou referene frame

More information

A TOPSIS based Method for Gene Selection for Cancer Classification

A TOPSIS based Method for Gene Selection for Cancer Classification Volume 67 No17, April 2013 A TOPSIS baed Method for Gene Selection for Cancer Claification IMAbd-El Fattah,WIKhedr, KMSallam, 1 Department of Statitic, 3 Department of Deciion upport, 2 Department of information

More information

Representations and Transformations. Objectives

Representations and Transformations. Objectives Repreentation and Tranformation Objective Derive homogeneou coordinate tranformation matrice Introduce tandard tranformation - Rotation - Tranlation - Scaling - Shear Scalar, Point, Vector Three baic element

More information

Compressed Sensing Image Processing Based on Stagewise Orthogonal Matching Pursuit

Compressed Sensing Image Processing Based on Stagewise Orthogonal Matching Pursuit Senor & randucer, Vol. 8, Iue 0, October 204, pp. 34-40 Senor & randucer 204 by IFSA Publihing, S. L. http://www.enorportal.com Compreed Sening Image Proceing Baed on Stagewie Orthogonal Matching Puruit

More information

Shortest Paths in Directed Graphs

Shortest Paths in Directed Graphs Shortet Path in Direted Graph Jonathan Turner January, 0 Thi note i adapted from Data Struture and Network Algorithm y Tarjan. Let G = (V, E) e a direted graph and let length e a real-valued funtion on

More information

How to. write a paper. The basics writing a solid paper Different communities/different standards Common errors

How to. write a paper. The basics writing a solid paper Different communities/different standards Common errors How to write a paper The baic writing a olid paper Different communitie/different tandard Common error Reource Raibert eay My grammar point Article on a v. the Bug in writing Clarity Goal Conciene Calling

More information

KINEMATIC ANALYSIS OF VARIOUS ROBOT CONFIGURATIONS

KINEMATIC ANALYSIS OF VARIOUS ROBOT CONFIGURATIONS International Reearh Journal of Engineering and Tehnology (IRJET) e-in: 39-6 Volume: 4 Iue: May -7 www.irjet.net p-in: 39-7 KINEMATI ANALYI OF VARIOU ROBOT ONFIGURATION Game R. U., Davkhare A. A., Pakhale..

More information

KS3 Maths Assessment Objectives

KS3 Maths Assessment Objectives KS3 Math Aement Objective Tranition Stage 9 Ratio & Proportion Probabilit y & Statitic Appreciate the infinite nature of the et of integer, real and rational number Can interpret fraction and percentage

More information

Performance of a Robust Filter-based Approach for Contour Detection in Wireless Sensor Networks

Performance of a Robust Filter-based Approach for Contour Detection in Wireless Sensor Networks Performance of a Robut Filter-baed Approach for Contour Detection in Wirele Senor Network Hadi Alati, William A. Armtrong, Jr., and Ai Naipuri Department of Electrical and Computer Engineering The Univerity

More information

Modeling of underwater vehicle s dynamics

Modeling of underwater vehicle s dynamics Proceeding of the 11th WEA International Conference on YTEM, Agio Nikolao, Crete Iland, Greece, July 23-25, 2007 44 Modeling of underwater vehicle dynamic ANDRZEJ ZAK Department of Radiolocation and Hydrolocation

More information

Routing Definition 4.1

Routing Definition 4.1 4 Routing So far, we have only looked at network without dealing with the iue of how to end information in them from one node to another The problem of ending information in a network i known a routing

More information

/06/$ IEEE 364

/06/$ IEEE 364 006 IEEE International ympoium on ignal Proceing and Information Technology oie Variance Etimation In ignal Proceing David Makovoz IPAC, California Intitute of Technology, MC-0, Paadena, CA, 95 davidm@ipac.caltech.edu;

More information

Laboratory Exercise 2

Laboratory Exercise 2 Laoratory Exercie Numer and Diplay Thi i an exercie in deigning cominational circuit that can perform inary-to-decimal numer converion and inary-coded-decimal (BCD) addition. Part I We wih to diplay on

More information

Quadrilaterals. Learning Objectives. Pre-Activity

Quadrilaterals. Learning Objectives. Pre-Activity Section 3.4 Pre-Activity Preparation Quadrilateral Intereting geometric hape and pattern are all around u when we tart looking for them. Examine a row of fencing or the tiling deign at the wimming pool.

More information

Building a Compact On-line MRF Recognizer for Large Character Set using Structured Dictionary Representation and Vector Quantization Technique

Building a Compact On-line MRF Recognizer for Large Character Set using Structured Dictionary Representation and Vector Quantization Technique 202 International Conference on Frontier in Handwriting Recognition Building a Compact On-line MRF Recognizer for Large Character Set uing Structured Dictionary Repreentation and Vector Quantization Technique

More information

The Alpha Torque and Quantum Physics

The Alpha Torque and Quantum Physics The Alpha Torque and Quantum Physis Zhiliang Cao, Henry Cao williamao15000@yahoo.om, henry.gu.ao@gmail.om July 18, 010 Abstrat In the enter of the unierse, there isn t a super massie blak hole or any speifi

More information

Operational Semantics Class notes for a lecture given by Mooly Sagiv Tel Aviv University 24/5/2007 By Roy Ganor and Uri Juhasz

Operational Semantics Class notes for a lecture given by Mooly Sagiv Tel Aviv University 24/5/2007 By Roy Ganor and Uri Juhasz Operational emantic Page Operational emantic Cla note for a lecture given by Mooly agiv Tel Aviv Univerity 4/5/7 By Roy Ganor and Uri Juhaz Reference emantic with Application, H. Nielon and F. Nielon,

More information

ISSN (Online), Volume 1, Special Issue 2(ICITET 15), March 2015 International Journal of Innovative Trends and Emerging Technologies

ISSN (Online), Volume 1, Special Issue 2(ICITET 15), March 2015 International Journal of Innovative Trends and Emerging Technologies International Journal of Innovative Trend and Emerging Tehnologie ROBUST SCAN TECHNIQUE FOR SECURED AES AGAINST DIFFERENTIAL CRYPTANALYSIS BASED SIDE CHANNEL ATTACK A.TAMILARASAN 1, MR.A.ANBARASAN 2 1

More information

A NEW APPROACH IN MEASURING OF THE ROUGHNESS FOR SURFACE CONSTITUTED WITH MACHINING PROCESS BY MATERIAL REMOVAL

A NEW APPROACH IN MEASURING OF THE ROUGHNESS FOR SURFACE CONSTITUTED WITH MACHINING PROCESS BY MATERIAL REMOVAL International Journal of Mechanical and Production Engineering Reearch and Development (IJMPERD) ISSN 49-689 Vol. 3, Iue, Mar 3, 4-5 TJPRC Pvt. Ltd. A NEW APPROACH IN MEASURING OF THE ROUGHNESS FOR SURFACE

More information

Parametric Micro-level Performance Models for Parallel Computing

Parametric Micro-level Performance Models for Parallel Computing Computer Siene Tehnial Report Computer Siene 12-5-1994 Parametri Miro-level Performane Model for Parallel Computing Youngtae Kim Iowa State Univerity Mark Fienup Iowa State Univerity Jeffrey S. Clary Iowa

More information

1 The secretary problem

1 The secretary problem Thi i new material: if you ee error, pleae email jtyu at tanford dot edu 1 The ecretary problem We will tart by analyzing the expected runtime of an algorithm, a you will be expected to do on your homework.

More information

Advanced Encryption Standard and Modes of Operation

Advanced Encryption Standard and Modes of Operation Advanced Encryption Standard and Mode of Operation G. Bertoni L. Breveglieri Foundation of Cryptography - AES pp. 1 / 50 AES Advanced Encryption Standard (AES) i a ymmetric cryptographic algorithm AES

More information

The Association of System Performance Professionals

The Association of System Performance Professionals The Aociation of Sytem Performance Profeional The Computer Meaurement Group, commonly called CMG, i a not for profit, worldwide organization of data proceing profeional committed to the meaurement and

More information

Floating Point CORDIC Based Power Operation

Floating Point CORDIC Based Power Operation Floating Point CORDIC Baed Power Operation Kazumi Malhan, Padmaja AVL Electrical and Computer Engineering Department School of Engineering and Computer Science Oakland Univerity, Rocheter, MI e-mail: kmalhan@oakland.edu,

More information

Visual Targeted Advertisement System Based on User Profiling and Content Consumption for Mobile Broadcasting Television

Visual Targeted Advertisement System Based on User Profiling and Content Consumption for Mobile Broadcasting Television Viual Targeted Advertiement Sytem Baed on Uer Profiling and ontent onumption for Mobile Broadating Televiion Silvia Uribe Federio Alvarez Joé Manuel Menéndez Guillermo inero Abtrat ontent peronaliation

More information

Minimum congestion spanning trees in bipartite and random graphs

Minimum congestion spanning trees in bipartite and random graphs Minimum congetion panning tree in bipartite and random graph M.I. Otrovkii Department of Mathematic and Computer Science St. John Univerity 8000 Utopia Parkway Queen, NY 11439, USA e-mail: otrovm@tjohn.edu

More information

A PROBABILISTIC NOTION OF CAMERA GEOMETRY: CALIBRATED VS. UNCALIBRATED

A PROBABILISTIC NOTION OF CAMERA GEOMETRY: CALIBRATED VS. UNCALIBRATED A PROBABILISTIC NOTION OF CAMERA GEOMETRY: CALIBRATED VS. UNCALIBRATED Jutin Domke and Yianni Aloimono Computational Viion Laboratory, Center for Automation Reearch Univerity of Maryland College Park,

More information

Using Bayesian Networks for Cleansing Trauma Data

Using Bayesian Networks for Cleansing Trauma Data Uing Bayeian Network for Cleaning Trauma Data Prahant J. Dohi pdohi@.ui.edu Dept. of Computer Siene Univ of Illinoi, Chiago, IL 60607 Lloyd G. Greenwald lgreenwa@.drexel.edu Dept. of Computer Siene Drexel

More information

IMPLEMENTATION OF AREA, VOLUME AND LINE SOURCES

IMPLEMENTATION OF AREA, VOLUME AND LINE SOURCES December 01 ADMS 5 P503I1 IMPEMENTATION OF AREA, VOUME AND INE SOURCES The Met. Office (D J Thomon) and CERC 1. INTRODUCTION ADMS model line ource, and area and volume ource with conve polgon bae area.

More information

Analyzing Hydra Historical Statistics Part 2

Analyzing Hydra Historical Statistics Part 2 Analyzing Hydra Hitorical Statitic Part Fabio Maimo Ottaviani EPV Technologie White paper 5 hnode HSM Hitorical Record The hnode i the hierarchical data torage management node and ha to perform all the

More information

Laboratory Exercise 6

Laboratory Exercise 6 Laboratory Exercie 6 Adder, Subtractor, and Multiplier The purpoe of thi exercie i to examine arithmetic circuit that add, ubtract, and multiply number. Each type of circuit will be implemented in two

More information

A Boyer-Moore Approach for. Two-Dimensional Matching. Jorma Tarhio. University of California. Berkeley, CA Abstract

A Boyer-Moore Approach for. Two-Dimensional Matching. Jorma Tarhio. University of California. Berkeley, CA Abstract A Boyer-Moore Approach for Two-Dimenional Matching Jorma Tarhio Computer Science Diviion Univerity of California Berkeley, CA 94720 Abtract An imple ublinear algorithm i preented for two-dimenional tring

More information

Trainable Context Model for Multiscale Segmentation

Trainable Context Model for Multiscale Segmentation Trainable Context Model for Multicale Segmentation Hui Cheng and Charle A. Bouman School of Electrical and Computer Engineering Purdue Univerity Wet Lafayette, IN 47907-1285 {hui, bouman}@ ecn.purdue.edu

More information

View-Based Tree-Language Rewritings

View-Based Tree-Language Rewritings View-Baed Tree-Language Rewriting Lak Lakhmanan, Alex Thomo Univerity of Britih Columbia, Canada Univerity of Vitoria, Canada Importane of tree XML Semi-trutured textual format are very popular.

More information

Hassan Ghaziri AUB, OSB Beirut, Lebanon Key words Competitive self-organizing maps, Meta-heuristics, Vehicle routing problem,

Hassan Ghaziri AUB, OSB Beirut, Lebanon Key words Competitive self-organizing maps, Meta-heuristics, Vehicle routing problem, COMPETITIVE PROBABIISTIC SEF-ORGANIZING MAPS FOR ROUTING PROBEMS Haan Ghaziri AUB, OSB Beirut, ebanon ghaziri@aub.edu.lb Abtract In thi paper, we have applied the concept of the elf-organizing map (SOM)

More information

Calculations for multiple mixers are based on a formalism that uses sideband information and LO frequencies: ( ) sb

Calculations for multiple mixers are based on a formalism that uses sideband information and LO frequencies: ( ) sb Setting frequeny parameter in the WASP databae A. Harri 24 Aug 2003 Calulation for multiple mixer are baed on a formalim that ue ideband information and LO frequenie: b b := ign f ig f LO f IF := f ig

More information

ANALYSIS OF THE FIRST LAYER IN WEIGHTLESS NEURAL NETWORKS FOR 3_DIMENSIONAL PATTERN RECOGNITION

ANALYSIS OF THE FIRST LAYER IN WEIGHTLESS NEURAL NETWORKS FOR 3_DIMENSIONAL PATTERN RECOGNITION ANALYSIS OF THE FIRST LAYER IN WEIGHTLESS NEURAL NETWORKS FOR 3_DIMENSIONAL PATTERN RECOGNITION A. Váque-Nava * Ecuela de Ingeniería. CENTRO UNIVERSITARIO MEXICO. DIVISION DE ESTUDIOS SUPERIORES J. Figueroa

More information

Performance Evaluation of an Advanced Local Search Evolutionary Algorithm

Performance Evaluation of an Advanced Local Search Evolutionary Algorithm Anne Auger and Nikolau Hanen Performance Evaluation of an Advanced Local Search Evolutionary Algorithm Proceeding of the IEEE Congre on Evolutionary Computation, CEC 2005 c IEEE Performance Evaluation

More information

Description of Traffic in ATM Networks by the First Erlang Formula

Description of Traffic in ATM Networks by the First Erlang Formula 5th International Conferene on Information Tehnology and Appliation (ICITA 8) Deription of Traffi in ATM Network by the Firt Erlang Formula Erik Chromý, Matej Kavaký and Ivan Baroňák Abtrat In the paper

More information

SLA Adaptation for Service Overlay Networks

SLA Adaptation for Service Overlay Networks SLA Adaptation for Service Overlay Network Con Tran 1, Zbigniew Dziong 1, and Michal Pióro 2 1 Department of Electrical Engineering, École de Technologie Supérieure, Univerity of Quebec, Montréal, Canada

More information

Edits in Xylia Validity Preserving Editing of XML Documents

Edits in Xylia Validity Preserving Editing of XML Documents dit in Xylia Validity Preerving diting of XML Document Pouria Shaker, Theodore S. Norvell, and Denni K. Peter Faculty of ngineering and Applied Science, Memorial Univerity of Newfoundland, St. John, NFLD,

More information

Motion Control (wheeled robots)

Motion Control (wheeled robots) 3 Motion Control (wheeled robot) Requirement for Motion Control Kinematic / dynamic model of the robot Model of the interaction between the wheel and the ground Definition of required motion -> peed control,

More information

Relayer Selection Strategies in Cellular Networks with Peer-to-Peer Relaying

Relayer Selection Strategies in Cellular Networks with Peer-to-Peer Relaying Relayer Seletion Strategie in Cellular Network with Peer-to-Peer Relaying V. Sreng, H. Yanikomeroglu, and D. D. Faloner Broadband Communiation and Wirele Sytem (BCWS) Centre Dept. of Sytem and Computer

More information

Comparison of Methods for Horizon Line Detection in Sea Images

Comparison of Methods for Horizon Line Detection in Sea Images Comparion of Method for Horizon Line Detection in Sea Image Tzvika Libe Evgeny Gerhikov and Samuel Koolapov Department of Electrical Engineering Braude Academic College of Engineering Karmiel 2982 Irael

More information

Pruning Game Tree by Rollouts

Pruning Game Tree by Rollouts Pruning Game Tree by Rollout Bojun Huang Mirooft Reearh bojhuang@mirooft.om Abtrat In thi paper we how that the α-β algorithm and it ueor MT-SSS*, a two lai minimax earh algorithm, an be implemented a

More information

A note on degenerate and spectrally degenerate graphs

A note on degenerate and spectrally degenerate graphs A note on degenerate and pectrally degenerate graph Noga Alon Abtract A graph G i called pectrally d-degenerate if the larget eigenvalue of each ubgraph of it with maximum degree D i at mot dd. We prove

More information

Computer Arithmetic Homework Solutions. 1 An adder for graphics. 2 Partitioned adder. 3 HDL implementation of a partitioned adder

Computer Arithmetic Homework Solutions. 1 An adder for graphics. 2 Partitioned adder. 3 HDL implementation of a partitioned adder Computer Arithmetic Homework 3 2016 2017 Solution 1 An adder for graphic In a normal ripple carry addition of two poitive number, the carry i the ignal for a reult exceeding the maximum. We ue thi ignal

More information

Web Science and additionality

Web Science and additionality Admin tuff... Lecture 1: EITN01 Web Intelligence and Information Retrieval Meage, lide, handout, lab manual and link: http://www.eit.lth.e/coure/eitn01 Contact: Ander Ardö, Ander.Ardo@eit.lth.e, room:

More information

Tu SBT4 12 Most Frequent Value Based Factor Analysis of Engineering Geophysical Sounding Logs

Tu SBT4 12 Most Frequent Value Based Factor Analysis of Engineering Geophysical Sounding Logs 30 May June 016 Reed Mee Wien Tu SBT4 1 Mot Frequent Value Baed Factor Analyi of Engineering Geophyical Sounding Log N.P. Szabo* (MTA-ME Geoeng. Re. Group, Univ. of Mikolc) & G.P. Balogh (Univerity of

More information

CSE 250B Assignment 4 Report

CSE 250B Assignment 4 Report CSE 250B Aignment 4 Report March 24, 2012 Yuncong Chen yuncong@c.ucd.edu Pengfei Chen pec008@ucd.edu Yang Liu yal060@c.ucd.edu Abtract In thi project, we implemented the recurive autoencoder (RAE) a decribed

More information

Q1:Choose the correct answer:

Q1:Choose the correct answer: Q:Chooe the orret anwer:. Purpoe of an OS i a. Create abtration b. Multiple proee ompete for ue of proeor. Coordination. Sheduler deide a. whih proee get to ue the proeor b. when proee get to ue the proeor.

More information

Topics. Lecture 37: Global Optimization. Issues. A Simple Example: Copy Propagation X := 3 B > 0 Y := 0 X := 4 Y := Z + W A := 2 * 3X

Topics. Lecture 37: Global Optimization. Issues. A Simple Example: Copy Propagation X := 3 B > 0 Y := 0 X := 4 Y := Z + W A := 2 * 3X Lecture 37: Global Optimization [Adapted from note by R. Bodik and G. Necula] Topic Global optimization refer to program optimization that encompa multiple baic block in a function. (I have ued the term

More information

Areas of Regular Polygons. To find the area of a regular polygon. The Solve It involves the area of a polygon.

Areas of Regular Polygons. To find the area of a regular polygon. The Solve It involves the area of a polygon. 10- Area of Regular Polygon Common Core State Standard G-MG.A.1 Ue geometric hape, their meaure, and their propertie to decribe object. Alo G-CO.D.1 MP 1, MP, MP 4, MP 6, MP 7 Objective To find the area

More information

A DIVISIVE HIERARCHICAL CLUSTERING- BASED METHOD FOR INDEXING IMAGE INFORMATION

A DIVISIVE HIERARCHICAL CLUSTERING- BASED METHOD FOR INDEXING IMAGE INFORMATION A DIVISIVE HIERARCHICAL CLUSTERING- BASED METHOD FOR INDEXING IMAGE INFORMATION ABSTRACT Najva Izadpanah Department of Computer Engineering, Ilamic Azad Univerity, Qazvin Branch, Qazvin, Iran In mot practical

More information

Learning with Previously Unseen Features

Learning with Previously Unseen Features Learning with Preiouly Uneen Feature Yuan Shi Computer Science Department Unierity of Southern California yuanhi@uc.edu Craig A. Knoblock Information Science Intitute Unierity of Southern California knoblock@ii.edu

More information

[N309] Feedforward Active Noise Control Systems with Online Secondary Path Modeling. Muhammad Tahir Akhtar, Masahide Abe, and Masayuki Kawamata

[N309] Feedforward Active Noise Control Systems with Online Secondary Path Modeling. Muhammad Tahir Akhtar, Masahide Abe, and Masayuki Kawamata he 32nd International Congre and Expoition on Noie Control Engineering Jeju International Convention Center, Seogwipo, Korea, Augut 25-28, 2003 [N309] Feedforward Active Noie Control Sytem with Online

More information

Finite Elements Method in Split Hopkinson Pressure Bar developing process

Finite Elements Method in Split Hopkinson Pressure Bar developing process 6th WSEAS International Conference on SYSTEM SCIENCE and SIMULATION in ENGINEERING, Venice, Italy, November 1-3, 007 63 Finite Element Method in Split Hopkinon Preure Bar developing proce ROTARIU ADRIAN

More information

arxiv: v1 [physics.soc-ph] 17 Oct 2013

arxiv: v1 [physics.soc-ph] 17 Oct 2013 Emergene of Blind Area in Information Sreading arxiv:131707v1 [hyi.o-h] 17 Ot 2013 Zi-Ke Zhang 1,2,, Chu-Xu Zhang 1,3,, Xiao-Pu Han 1,2 and Chuang Liu 1,2 1 Intitute of Information Eonomy, Hangzhou Normal

More information

Karen L. Collins. Wesleyan University. Middletown, CT and. Mark Hovey MIT. Cambridge, MA Abstract

Karen L. Collins. Wesleyan University. Middletown, CT and. Mark Hovey MIT. Cambridge, MA Abstract Mot Graph are Edge-Cordial Karen L. Collin Dept. of Mathematic Weleyan Univerity Middletown, CT 6457 and Mark Hovey Dept. of Mathematic MIT Cambridge, MA 239 Abtract We extend the definition of edge-cordial

More information

Markov Random Fields in Image Segmentation

Markov Random Fields in Image Segmentation Preented at SSIP 2011, Szeged, Hungary Markov Random Field in Image Segmentation Zoltan Kato Image Proceing & Computer Graphic Dept. Univerity of Szeged Hungary Zoltan Kato: Markov Random Field in Image

More information

Topics. FPGA Design EECE 277. Number Representation and Adders. Class Exercise. Laboratory Assignment #2

Topics. FPGA Design EECE 277. Number Representation and Adders. Class Exercise. Laboratory Assignment #2 FPGA Deign EECE 277 Number Repreentation and Adder Dr. William H. Robinon Februar 2, 25 Topi There are kind of people in the world, thoe that undertand binar and thoe that don't. Unknown Adminitrative

More information

Maneuverable Relays to Improve Energy Efficiency in Sensor Networks

Maneuverable Relays to Improve Energy Efficiency in Sensor Networks Maneuverable Relay to Improve Energy Efficiency in Senor Network Stephan Eidenbenz, Luka Kroc, Jame P. Smith CCS-5, MS M997; Lo Alamo National Laboratory; Lo Alamo, NM 87545. Email: {eidenben, kroc, jpmith}@lanl.gov

More information

On combining Learning Vector Quantization and the Bayesian classifiers for natural textured images

On combining Learning Vector Quantization and the Bayesian classifiers for natural textured images On combining Learning Vector Quantization and the Bayeian claifier for natural textured image María Guiarro Dept. Ingeniería del Software e Inteligencia Artificial Facultad Informática Univeridad Complutene

More information

HOW TO WRITE THE PROCEEDINGS AS A PKAS PAPER

HOW TO WRITE THE PROCEEDINGS AS A PKAS PAPER Publication of the Korean Atronomical Society pissn: 1225-1534 / eissn: 2287-6936 00: 1 99, 2015 January http://dx.doi.org/10.5303/pkas.2015.00.0.1 c 2015. The Korean Atronomical Society. All right reerved.

More information

A METHOD OF REAL-TIME NURBS INTERPOLATION WITH CONFINED CHORD ERROR FOR CNC SYSTEMS

A METHOD OF REAL-TIME NURBS INTERPOLATION WITH CONFINED CHORD ERROR FOR CNC SYSTEMS Vietnam Journal of Science and Technology 55 (5) (017) 650-657 DOI: 10.1565/55-518/55/5/906 A METHOD OF REAL-TIME NURBS INTERPOLATION WITH CONFINED CHORD ERROR FOR CNC SYSTEMS Nguyen Huu Quang *, Banh

More information

PARALLEL knn ON GPU ARCHITECTURE USING OpenCL

PARALLEL knn ON GPU ARCHITECTURE USING OpenCL PARALLEL knn ON GPU ARCHITECTURE USING OpenCL V.B.Nikam 1, B.B.Mehram 2 1 Aociate Profeor, Department of Computer Engineering and Information Technology, Jijabai Technological Intitute, Matunga, Mumbai,

More information

Using Mouse Feedback in Computer Assisted Transcription of Handwritten Text Images

Using Mouse Feedback in Computer Assisted Transcription of Handwritten Text Images 2009 10th International Conference on Document Analyi and Recognition Uing Moue Feedback in Computer Aited Trancription of Handwritten Text Image Verónica Romero, Alejandro H. Toelli, Enrique Vidal Intituto

More information

3D SMAP Algorithm. April 11, 2012

3D SMAP Algorithm. April 11, 2012 3D SMAP Algorithm April 11, 2012 Baed on the original SMAP paper [1]. Thi report extend the tructure of MSRF into 3D. The prior ditribution i modified to atify the MRF property. In addition, an iterative

More information

ANALYSIS OF PILE DRIVING IN VERTICAL AND HORIZONTAL DIRECTIONS USING A HYBRID MODEL

ANALYSIS OF PILE DRIVING IN VERTICAL AND HORIZONTAL DIRECTIONS USING A HYBRID MODEL ANALYSIS OF PILE DRIVING IN VERTICAL AND HORIZONTAL DIRECTIONS USING A HYBRID MODEL TATSUNORI MATSUMOTO i) PASTSAKORN KITIYODOM ii) EIJI KOJIMA iii) HIROMICHI KUMAGAI iv) SATOSHI NISHIMOTO v) and KOUICHI

More information

So we find a sample mean but what can we say about the General Education Statistics

So we find a sample mean but what can we say about the General Education Statistics So we fid a ample mea but what ca we ay about the Geeral Educatio Statitic populatio? Cla Note Cofidece Iterval for Populatio Mea (Sectio 9.) We will be doig early the ame tuff a we did i the firt ectio

More information

Shortest Paths Problem. CS 362, Lecture 20. Today s Outline. Negative Weights

Shortest Paths Problem. CS 362, Lecture 20. Today s Outline. Negative Weights Shortet Path Problem CS 6, Lecture Jared Saia Univerity of New Mexico Another intereting problem for graph i that of finding hortet path Aume we are given a weighted directed graph G = (V, E) with two

More information

An Optimized Approach on Applying Genetic Algorithm to Adaptive Cluster Validity Index

An Optimized Approach on Applying Genetic Algorithm to Adaptive Cluster Validity Index IJCSES International Journal of Computer Sienes and Engineering Systems, ol., No.4, Otober 2007 CSES International 2007 ISSN 0973-4406 253 An Optimized Approah on Applying Geneti Algorithm to Adaptive

More information

Automatic design of robust PID controllers based on QFT specifications

Automatic design of robust PID controllers based on QFT specifications IFAC Conferene on Advane in PID Control PID'1 Breia (Italy), Marh 8-3, 1 Automati deign of robut PID ontroller baed on QFT peifiation R. Comaòliva*, T. Eobet* J. Quevedo* * Advaned Control Sytem (SAC),

More information

USING ARTIFICIAL NEURAL NETWORKS TO APPROXIMATE A DISCRETE EVENT STOCHASTIC SIMULATION MODEL

USING ARTIFICIAL NEURAL NETWORKS TO APPROXIMATE A DISCRETE EVENT STOCHASTIC SIMULATION MODEL USING ARTIFICIAL NEURAL NETWORKS TO APPROXIMATE A DISCRETE EVENT STOCHASTIC SIMULATION MODEL Robert A. Kilmer Department of Sytem Engineering Unite State Military Acaemy Wet Point, NY 1996 Alice E. Smith

More information

An Intro to LP and the Simplex Algorithm. Primal Simplex

An Intro to LP and the Simplex Algorithm. Primal Simplex An Intro to LP and the Simplex Algorithm Primal Simplex Linear programming i contrained minimization of a linear objective over a olution pace defined by linear contraint: min cx Ax b l x u A i an m n

More information

Bottom Up parsing. Bottom-up parsing. Steps in a shift-reduce parse. 1. s. 2. np. john. john. john. walks. walks.

Bottom Up parsing. Bottom-up parsing. Steps in a shift-reduce parse. 1. s. 2. np. john. john. john. walks. walks. Paring Technologie Outline Paring Technologie Outline Bottom Up paring Paring Technologie Paring Technologie Bottom-up paring Step in a hift-reduce pare top-down: try to grow a tree down from a category

More information

Generic Traverse. CS 362, Lecture 19. DFS and BFS. Today s Outline

Generic Traverse. CS 362, Lecture 19. DFS and BFS. Today s Outline Generic Travere CS 62, Lecture 9 Jared Saia Univerity of New Mexico Travere(){ put (nil,) in bag; while (the bag i not empty){ take ome edge (p,v) from the bag if (v i unmarked) mark v; parent(v) = p;

More information

Audio-Visual Voice Command Recognition in Noisy Conditions

Audio-Visual Voice Command Recognition in Noisy Conditions Audio-Viual Voice Command Recognition in Noiy Condition Joef Chaloupka, Jan Nouza, Jindrich Zdanky Laboratory of Computer Speech Proceing, Intitute of Information Technology and Electronic, Technical Univerity

More information

Learning-Based Quality Control for Cardiac MR Images

Learning-Based Quality Control for Cardiac MR Images 1 Learning-Baed Quality Control for Cardiac MR Image Giacomo Tarroni, Ozan Oktay, Wenjia Bai, Andrea Schuh, Hideaki Suzuki, Jonathan Paerat-Palmbach, Antonio de Marvao, Declan P. O Regan, Stuart Cook,

More information

How to Select Measurement Points in Access Point Localization

How to Select Measurement Points in Access Point Localization Proceeding of the International MultiConference of Engineer and Computer Scientit 205 Vol II, IMECS 205, March 8-20, 205, Hong Kong How to Select Meaurement Point in Acce Point Localization Xiaoling Yang,

More information

Parity-constrained Triangulations with Steiner points

Parity-constrained Triangulations with Steiner points Parity-contrained Triangulation with Steiner point Victor Alarez October 31, 2012 Abtract Let P R 2 be a et of n point, of which k lie in the interior of the conex hull CH(P) of P. Let u call a triangulation

More information

Multi-Target Tracking In Clutter

Multi-Target Tracking In Clutter Multi-Target Tracking In Clutter John N. Sander-Reed, Mary Jo Duncan, W.B. Boucher, W. Michael Dimmler, Shawn O Keefe ABSTRACT A high frame rate (0 Hz), multi-target, video tracker ha been developed and

More information

SIMIT 7. Profinet IO Gateway. User Manual

SIMIT 7. Profinet IO Gateway. User Manual SIMIT 7 Profinet IO Gateway Uer Manual Edition January 2013 Siemen offer imulation oftware to plan, imulate and optimize plant and machine. The imulation- and optimizationreult are only non-binding uggetion

More information