Microsoft PowerPoint - A02-hmwu_R-Object.pptx

Size: px
Start display at page:

Download "Microsoft PowerPoint - A02-hmwu_R-Object.pptx"

Transcription

1 A02 R 程式語言的基礎 : 物件 吳漢銘國立臺北大學統計學系

2 本章大綱 & 學習目標 2/60 R 程式變數 (Variables) 命名法及語法 Rounding of Numbers 向量 (Vectors) 向量運算 規律的序列 邏輯向量 字元向量 遺失值 因子 (Factors) 陣列 (Arrays) 矩陣 (Matrices) 表列 (List) 資料框 (Data Frame) 時間日期 物件的模式 (Mode) 類別 (Class) 屬性 (Attributes) 查詢物件之模式 類別 屬性 結構及可取用的元素 存取物件內之元素

3 R 變數命名法 3/60 Case sensitive A and a are different All alphanumeric symbols are allowed (A-Z, a-z, 0-9)., _. Name must start with. or a letter. 錯誤命名 3x 3_x 3-x 3.x.3variable 正確命名 x_3 x3 x.3 taiwan.taipei.x3.variable Google's R Style Guide Function name: Make function names verbs. GOOD : CalculateAvgClicks BAD : calculate_avg_clicks BAD : calculateavgclicks Variable name: GOOD : avg.clicks OK: avgclicks BAD : avg_clicks File names: be meaningful. GOOD: predict_ad_revenue.r BAD: foo.r

4 R 語法 4/60 Assignments x <- 5 x = 5 x (x <- 5) [1] 5 assign("x", 2) 2 - x a <- b <- c <- 6 x <- expressions x <- 3+5 ; or new line x <- 5 ; y <- 7 or x <- 5 Y <- 7 Assignment: 建議使用 <-, 而不是 = Google's R Style Guide Comment # how are you? + : If a comment is not complete at the end of a line, R will give a different prompt. x <- + 5 (y <- 1:5) 提示符號 (prompt) [1] sum(y) [1] 15 options(prompt = 'hmwu ', continue = "+ ") hmwu sum(y^2) [1] 55 hmwu options(prompt = ' ', continue = "+ ")

5 物件 (Objects) 5/60 Variables, arrays of numbers, character strings, functions, x <- 3+5 y <- 7 objects() [1] "x" "y" ls() [1] "x" "y" rm(x, y) rm(list = ls()) objects() character(0) 儲存 R 物件所佔用的記憶體估計 : object.size(x) print(object.size(x), units = "Mb") n < p <- 200 mydata <- matrix(rnorm(n*p), ncol = p, nrow=n) print(object.size(mydata), units = "Mb") 15.3 Mb os <- function(x){ + print(object.size(x), units = "Mb") + } os(mydata) 15.3 Mb

6 物件 (Objects) 6/60 x <- 2 # x is a vector of length 1 x <- vector() # x is a vector of 0 length x <- matrix() # x is a matrix of 1 column, 1 row x <- 'Hello Dolly' # x is a vector containing 1 string x <- c('hello', 'Dolly') # x is a vector with 2 strings x <- function(){} # x is a function that does nothing The vectors are atomic objects all of their elements must be of the same mode. Most other types of objects in R are more complex than vectors. They may consist of collections of vectors, matrices, data frames and functions. When an object is created (for example with the assignment <-), R must allocate memory for the object. The amount of memory allocated depends on the mode of the object.

7 Rounding of Numbers 7/60 ceiling: the smallest integers not less than the corresponding elements of x. floor: the largest integers not greater than the corresponding elements of x. x n n+1 floor(x) ceiling(x) trunc: the integers formed by truncating the values in x toward 0. round: rounds the values in its first argument to the specified number of decimal places (default 0). (x <- c(pi, 1/3, -1/3, -pi)) [1] ceiling(x) [1] floor(x) [1] trunc(x) [1] round(x, 2) [1] round(x, 5) [1] # checking if a number is an integer (x <- c(1/3, 2, -4, 1.5)) [1] ceiling(x) == floor(x) [1] FALSE TRUE TRUE FALSE

8 設定數值顯示位數 (1) 8/60 getoption("digits") # digits: controls the number (1~22, default 7) of digits to print when printing numeric values. [1] 7 x1 <- c(-10, , 0, , 10) x2 <- c(-10, , 0, , 10, pi) x3 <- c(-12, , 0, , 12) x4 <- c( e+09, e-09, 10, pi, , ) x1 # same as print(x1) [1] -1e+01-1e-05 0e+00 1e-05 1e+01 x2 [1] x3 [1] x4 [1] e e e e e-07 cat(x1, "\n") -10-1e e cat(x2, "\n") -10-1e e cat(x3, "\n") cat(x4, "\n") e e-07

9 設定數值顯示位數 (2) 9/60 op <- options(); str(op) # nicer printing List of 72 $ add.smooth : logi TRUE... options(digits = 3) # try options(digits = 1) or options(digits = 5) x1 # same as print(x1) [1] -1e+01-1e-05 0e+00 1e-05 1e+01 x2 [1] x3 [1] x4 [1] 1.81e e e e e-07 cat(x1, "\n") -10-1e e cat(x2, "\n") -10-1e e cat(x3, "\n") cat(x4, "\n") 1.81e e e-07 options(op) # reset (all) initial options options("digits") # or getoption("digits") $digits [1] 7 See also: getoption( scipen ) # (penalty) print numeric values in fixed (scipen = positive integer) notation or exponential (negative integer) notation. Fixed notation will be preferred unless it is more than scipen digits wider. options(scipen = 100, digits = 4) options(scipen = 999) # do not show scientific notation

10 向量 (Vector) 10/60 向量 (vector): 同樣屬性 ( 數字或文字 ) 的資料的集合 c(): 串連多個字串 (combine values into a vector or list) x1 <- c(10, 5, 3, 6, 2.7) x1 [1] assign("x2", c(10, 5, 3, 6, 2.7)) x2 [1] c(10, 5, 3, 6, 2.7) - x3 x3 [1] length(x1) [1] 5 c(1,7:9) [1] c(1:5, 10.5, "next") [1] "1" "2" "3" "4" "5" "10.5" "next" x1[4] [1] 6 x1[2:4] [1] x1[c(4, 2, 1)] [1] x1[-3] [1] x1[x1<5] [1] x1[10] [1] NA x1[2] <- 32; x1 [1] x1[c(1, 3, 5)] <- c(1,2,3) x1 [1]

11 向量 (Vectors) 11/60 (y1 <- 1/x1) [1] length(y1) [1] 5 v1 <- x1 + y1+1; v1; length(v1) [1] [1] 5 (y2 <- c(x1, 0, x1)); length(y2) [1] [1] 11 length(x1) [1] 5 (v2 <- x1 + y2 + 1); length(v2) [1] Warning message: In x1 + y2 : longer object length is not a multiple of shorter object length [1] 11 x1 repeated 2.2 times, y2 repeated one time, 1 repeated 11 times

12 課堂練習 1 12/60 注意 : 打完一行程式, 就立刻執行, 查看結果

13 向量運算 (Vector Arithmetic) 13/60 一些簡單的數學計算 : +, -, *, /, ^ log(x), logb(x, b) pi, exp(x), sin(pi/2), cos(pi), tan(pi/4), abs(x), sqrt(x), length(x) prod(x) choose(n, k) factorial(x) 一些簡單的統計運算 : max(x), min(x) pmax(x), pmin(x) range(x) c(min(x), max(x)) mean(x) sum(x)/length(x) var(x), cov(x) sum((x-mean(x))^2)/(length(x)-1) sqrt(var(x)) median(x) summary(x) cor(x, y)?mean 其它函式應用查看 mean 的用法 sort(x)# 排序, 由小到大 mean(x, trim = 0, na.rm = FALSE,...) rank(x)# 排序等級 order(x)# 排序後, 各個元素的原始所在位置

14 課堂練習 2 14/60 x <- c(1.58, -0.29, 0.59, -0.38, 0.72) max(x) [1] 1.58 min(x) [1] range(x) [1] c(min(x), max(x)) [1] mean(x) [1] sum(x)/length(x) [1] var(x) [1] sum( (x-mean(x))^2)/(length(x)-1) [1] sqrt(var(x)) [1] median(x) [1] 0.59 summary(x) Min. 1st Qu. Median Mean 3rd Qu. Max sort(x) [1] rank(x) [1] order(x) [1]

15 規律的序列 (Regular Sequences) 15/60 x <- c(1,2,3,4,5,6,7,8,9,10) x <- 1:10 y <- 10:2 2*1:10 #The colon operator has high priority with an expression [1] n <- 10 1:n-1 [1] :(n-1) [1] width <- 1 seq(from = 2, to = 5, by = width) [1] :5 [1] s1 <- seq(-5, 5, by = 0.2) # s2 <- seq(length = 51, from = -5, by = 0.2) #

16 規律的序列 (Regular Sequences) 16/60 rep(x, times=5) [1] [19] [37] rep(x, each=5) [1] [19] [37] rep(1:4, each=5) [1] rep(letters[1:4], 3) [1] "A" "B" "C" "D" "A" "B" "C" "D" "A" "B" "C" "D" rep(letters[1:4], length.out=3) [1] "A" "B" "C"

17 課堂練習 3: 造出規律的序列 17/ Fibonacci number ( 可能需要用到 for): rev, sequence Ex: 將 [0, 2] 分成 20 等份的子區間 取左端點 取右端點 取子區間之中點 ([a, b] 之 partition, 用於 Riemann Sum)

18 邏輯向量 (Logical Vectors) 18/60 TRUE, FALSE T, F Logical operators <, <=,, =, ==,!= c1,c2: logical expression c1&c2: intersection and c1 c2: union or x <- c(12, 4, 7, 20, 13) x < 15 [1] TRUE TRUE TRUE FALSE TRUE x <= 15 [1] TRUE TRUE TRUE FALSE TRUE x 13 [1] FALSE FALSE FALSE TRUE FALSE x = 10 [1] TRUE FALSE FALSE TRUE TRUE x == 12 [1] TRUE FALSE FALSE FALSE FALSE x!= 20 [1] TRUE TRUE TRUE FALSE TRUE (x = 3) [1] 3 (x 10) [1] TRUE FALSE FALSE TRUE TRUE x!= 20 [1] TRUE TRUE TRUE FALSE TRUE (x 10) & (x!= 20) [1] TRUE FALSE FALSE FALSE TRUE (x 10) (x!= 20) [1] TRUE TRUE TRUE TRUE TRUE (x = 10) [1] TRUE FALSE FALSE TRUE TRUE 1*(x = 10) [1] (x = 15) [1] FALSE FALSE FALSE TRUE FALSE 2*(x = 15) [1]

19 遺失值 (Missing Values) 19/60 NA: not available, missing values z <- c(1:3, NA) z [1] NA ind <- is.na(z) ind [1] FALSE FALSE FALSE TRUE A vector of the same length as x all of whose values are NA x == NA [1] NA NA NA NA NA NaN: not a number, missing values 0/0 [1] NaN Inf - Inf [1] NaN See also: na.fail(x), na.pass(x), na.omit(x), na.exclude(x) is.na(xx)is TRUE both for NA and NaN values is.nan(xx)is only TRUE for NaNs

20 練習 : NA, NaN and Inf 20/60 x <- c(na, 0 / 0, Inf - Inf, Inf, 5) # Inf is a number. x [1] NA NaN NaN Inf 5 y <- data.frame(x, is.na(x), is.nan(x), x == Inf, x == 5) y x is.na.x. is.nan.x. x...inf x NA TRUE FALSE NA NA 2 NaN TRUE TRUE NA NA 3 NaN TRUE TRUE NA NA 4 Inf FALSE FALSE TRUE FALSE 5 5 FALSE FALSE FALSE TRUE colnames(y) <- c("x", "is.na(x)", "is.nan(x)", "x == Inf", "x == 5") y x is.na(x) is.nan(x) x == Inf x == 5 1 NA TRUE FALSE NA NA 2 NaN TRUE TRUE NA NA 3 NaN TRUE TRUE NA NA 4 Inf FALSE FALSE TRUE FALSE 5 5 FALSE FALSE FALSE TRUE

21 字元向量 (Character Vectors) 21/60 Character strings are entered using either double ( ) quotes or single ( ) quotes Character strings are printed using double quotes. (x <- "x-values") [1] "x-values" (y <- "New iteration results") [1] "New iteration results" (answer1 <- c("a1", "a2", "b1", "b3")) [1] "a1" "a2" "b1" "b3" (answer2 <- c('a1', 'a2', 'b1', 'b3')) [1] "a1" "a2" "b1" "b3" (answer3 <- c('a', "a2", 3)) [1] "a" "a2" "3" (answer4 <- c('my name is "Hank"')) [1] "My name is \"Hank\"" (answer5 <- c("my name is 'Hank'")) [1] "My name is 'Hank'" paste("a", 1:6, sep = "") [1] "A1" "A2" "A3" "A4" "A5" "A6" paste("today is", date()) [1] "Today is Wed Sep 24 13:26: " labs <- paste(c("x", "Y"), 1:10, sep = "") labs [1] "X1" "Y2" "X3" "Y4" "X5" "Y6" "X7" "Y8" "X9" "Y10"

22 跳脫字元 (Escape Character) 22/60 Escape Character: \n: new line. \t: tab. \b: backspace. cat("how are you?", "\n", "I'm fine.", "\n") How are you? I'm fine. cat("how are you?", "\t", "I'm fine.", "\n") How are you? I'm fine. cat("how are you?", "\b\b\b", "I'm fine.") How are yo I'm fine. NOTE: "\" is entered and printed as "\\" setwd("c:\\temp\\mydata")

23 索引向量 : Index Vector [] 23/60 A logical vector A vector of positive integral quantities x <- c(7, 2, 4, 9, NA, 4) x[2] [1] 2 x[5] [1] NA x[0] numeric(0) x[10] [1] NA y <- x[!is.na(x)] y [1] (x+1)[(!is.na(x))&(x0)] - z z [1] rep(c(1,2,2,1), times=3) [1] c("x","y")[rep(c(1,2,2,1), times=3)] [1] "x" "y" "y" "x" "x" "y" "y" "x" "x" "y" "y" "x"

24 索引向量 : Index Vector [] 24/60 A vector of negative integral quantities x <- c(7, 2, 4, 9, NA, 4) x[-2] [1] NA 4 x[-(1:3)] [1] 9 NA 4 A vector of character strings fruit <- c(5, 10, 1, 20) fruit [1] names(fruit) <- c("orange", "banana", "apple", "peach") fruit orange banana apple peach lunch <- fruit[c("apple", "orange")] lunch apple orange 1 5 x <- c(7, 2, 4, 9, NA, 4) x[is.na(x)] <- 0 x [1] y <- c(-7, 2, 4, 9, 0, -4) abs(y) [1] y[y<0] <- - y[y<0] y [1]

25 課堂練習 4 25/60 x <- c(a = 5, B = 3, third = 10) x A B third x[1] A 5 x["a"] A 5 x[c("third", "B")] third B 10 3 x[c(3, 1)] third A 10 5 names(x) [1] "A" "B" "third" names(x) <- c("aa", "BB", "CC") x AA BB CC # compare two "char" strings "A" < "B" [1] TRUE "Hank" <= "Tom" [1] TRUE "201" < "1" [1] FALSE c("201", "001") < "1" [1] FALSE TRUE c("1", "A", "a") < "a" [1] TRUE FALSE FALSE # compare T/F TRUE < FALSE [1] FALSE T F [1] TRUE # compare T/F, char, numeric 1 < "a" [1] TRUE "a" < FALSE [1] TRUE 1 T [1] FALSE 1 < T [1] FALSE 1 == T [1] TRUE 0 < F [1] FALSE 0 F [1] FALSE 0 == F [1] TRUE

26 因子 (Factors) 26/60 The levels of factors are stored in alphabetical order. scores <- c(60, 49, 90, 54, 54, 48, 61, 61, 51, 49, 49) gender <- c("f", "f", "m", "f", "m", "m", "m", "m", "f", "f", "m") levels(gender) NULL gender.f <- factor(gender) gender.f [1] f f m f m m m m f f m Levels: f m levels(gender.f) [1] "f" "m" table(gender.f) gender.f f m 5 6 levels(gender.f) <- c(" 女 ", " 男 ") gender.f [1] 女女男女男男男男女女男 Levels: 女男 (scores.mean <- tapply(scores, gender.f, mean)) 女男 grade <- as.factor(c("b", "F", "A", "C", "A", "C", "B", "A", "F", "D")) levels(grade) [1] "A" "B" "C" "D" "F" grade2 <- ordered(grade, levels = rev(levels(grade))) grade2 [1] B F A C A C B A F D Levels: F < D < C < B < A grade2[which(grade2 = "B")] [1] B A A B A Levels: F < D < C < B < A

27 因子 (Factors) 27/60 MyLetter <- c("c", "D", "A", "K", "A", "I", "J", "I", "K", "H", "A", "K", "K", "B", "E", "H", "G", "L", "H", "H", "I", "K", "B", "D") MyLetter.factor <- factor(myletter) MyLetter.factor [1] C D A K A I J I K H A K K B E H G L H H I K B D Levels: A B C D E G H I J K L table(myletter.factor) MyLetter.factor A B C D E G H I J K L MyLetter.ordered <- factor(myletter, levels = c("a", "B", "C", "D", "E", "F", "G", "H", "I", "J", "K", "L"), ordered = TRUE) MyLetter.ordered[1] < MyLetter.ordered[2] [1] TRUE table(myletter.ordered) MyLetter.ordered A B C D E F G H I J K L

28 陣列 (Arrays) 28/60 An array is a multiply subscripted collection of data entries. z <- 1:30 z [1] [29] dim(z) <- c(3,5,2) z,, 1 [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] ,, 2 [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] z[1,3,2] [1] 22 z[1,1,] [1] 1 16 z[1,,2] [1] z[1,1:2,1] [1] 1 4 z[-1,,],, 1 [,1] [,2] [,3] [,4] [,5] [1,] [2,] ,, 2 [,1] [,2] [,3] [,4] [,5] [1,] [2,]

29 陣列 (Arrays) 29/60 x <- array(1:20, dim=c(4,5)) x [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] [4,] i <- array(c(1:3, 3:1), dim=c(3,2)) i [,1] [,2] [1,] 1 3 [2,] 2 2 [3,] 3 1 x[i] <- 0 x [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] [4,] x <- c(1,2,3,4,5) x [1] z <- array(x, dim=c(3,4)) z [,1] [,2] [,3] [,4] [1,] [2,] [3,] t(z) #transpose [,1] [,2] [,3] [1,] [2,] [3,] [4,] See also: aperm {base}: Array Transposition

30 課堂練習 5: interval data 30/60 temperature January.a January.b February.a February.b AnQing BaoDing BeiJing BoKeTu ChangChun temparray <- array(0, dim=c(5,2,2)) temparray[,,1] <- as.matrix(temperature[,c(1,3)]) temparray[,,2] <- as.matrix(temperature[,c(2,4)]) temparray,, 1 [,1] [,2] [1,] [2,] [3,] [4,] [5,] ,, 2 [,1] [,2] [1,] [2,] [3,] [4,] [5,] colnames(temparray) <- c("january", "February") rownames(temparray) <- rownames(temperature) dimnames(temparray)[[3]] <- c("min", "max") dimnames(temparray) [[1]] [1] "AnQing" "BaoDing" "BeiJing" "BoKeTu" "ChangChun" [[2]] [1] "January" "February" [[3]] [1] "min" "max" temparray,, min January February AnQing BaoDing BeiJing BoKeTu ChangChun ,, max January February AnQing BaoDing BeiJing BoKeTu ChangChun

31 matrix(): 矩陣 31/60 A matrix is an array with two subscripts. x <- 1:20 A <- matrix(x, ncol=4) A [,1] [,2] [,3] [,4] [1,] [2,] [3,] [4,] [5,] A.1 <- matrix(x, ncol=4, byrow=true) A.1 [,1] [,2] [,3] [,4] [1,] [2,] [3,] [4,] [5,] nrow(a) [1] 5 ncol(a) [1] 4 dim(a) [1] 5 4 diag(a) [1] B <- matrix(x+2, ncol=4) A * B #element by element product [,1] [,2] [,3] [,4] [1,] [2,] [3,] [4,] [5,] A %*% t(b) #matrix product [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] [4,] [5,] x <- 4 diag(x) #identity matrix

32 矩陣 (Matrices) 32/60 apply(mat, 1, mean) # row means [1] apply(mat, 2, mean) # column means [1] apply(mat, 1, var) # row variances [1] apply(mat, 2, var) # column variances [1] mean(mat) [1] 10.5 var(mat) [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] [4,] [5,] summary(mat) V1 V2 V3 V4 V5 Min. :1.00 Min. :5.00 Min. : 9.00 Min. :13.00 Min. : st Qu.:1.75 1st Qu.:5.75 1st Qu.: st Qu.: st Qu.:17.75 Median :2.50 Median :6.50 Median :10.50 Median :14.50 Median :18.50 Mean :2.50 Mean :6.50 Mean :10.50 Mean :14.50 Mean : rd Qu.:3.25 3rd Qu.:7.25 3rd Qu.: rd Qu.: rd Qu.:19.25 Max. :4.00 Max. :8.00 Max. :12.00 Max. :16.00 Max. :20.00 mat <- matrix(1:20, ncol=5) mat [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] [4,] id <- mat[, 2] 5 id [1] FALSE TRUE TRUE TRUE mat[id, ] [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,]

33 矩陣的索引 33/60 (y <- array(1:15, dim=c(3, 5))) dim(y) [1] 3 5 x <- matrix(1:15, 3, 5) x [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] x[1] [1] 1 x[6] [1] 6 x <- matrix(1:15, 3, 5, byrow=true) x [,1] [,2] [,3] [,4] [,5] [1,] [2,] [3,] x[1] [1] 1 x[6] [1] 12 y[2, 4] [1] 11 y[1,] [1] y[,1] [1] y[2:3, ] [,1] [,2] [,3] [,4] [,5] [1,] [2,] y[-2,] [,1] [,2] [,3] [,4] [,5] [1,] [2,] y[,-2] [,1] [,2] [,3] [,4] [1,] [2,] [3,] dimnames(y) NULL rownames(y) NULL colnames(y) NULL

34 矩陣結合 (Forming Partitioned Matrices) cbind() and rbind() x <- c(1, 2, 3, 4, 5) y <- c(0.5, 0.4, 0.3, 0.2, 0.1) (z1 <- cbind(x,y)) x y [1,] [2,] [3,] [4,] [5,] (z2 <- rbind(x,y)) [,1] [,2] [,3] [,4] [,5] x y (A <- rbind(x,y)) [,1] [,2] [,3] [,4] [1,] [2,] [3,] [4,] [5,] [6,] [7,] (x <- matrix(1:20, ncol=4, nrow=5)) [,1] [,2] [,3] [,4] [1,] [2,] [3,] [4,] [5,] (y <- matrix(3:10, ncol=4)) [,1] [,2] [,3] [,4] [1,] [2,] (z <- matrix(rep(1:5, 2),nrow=5)) [,1] [,2] [1,] 1 1 [2,] 2 2 [3,] 3 3 [4,] 4 4 [5,] 5 5 (B <- cbind(x,z)) [,1] [,2] [,3] [,4] [,5] [,6] [1,] [2,] [3,] [4,] [5,] /60

35 常用矩陣運算 35/60

36 list(): 表列 36/60 List is an object consisting of an ordered collection of objects known as its components. A list could consist of a numeric vector, a logical value, a matrix, a complex vector, a character array, a function, and so on. 許多 R 統計函式回傳值皆是 list my.list <- list(name="george", wife="mary", no.children=3, child.ages=c(4,7,9)) my.list $name [1] "George" $wife [1] "Mary" $no.children [1] 3 $child.ages [1] Construct list: my.list <- list(name_1=object_1,,name_m=object_m) lst.abc <- list(list.a, list.b, list.c) see also:

37 表列 (List) 37/60 lst[1] vs lst[[1]] []: a general subscripting. [[]]: the operator used to select a single element. [1]: a sublist of the list consisting of the first entry. (name are included in the sublist). [[1]]: first object in the list, exclude name. my.list $name [1] "George" $wife [1] "Mary" $no.children [1] 3 $child.ages [1] my.list[[1]] # 傳回向量 [1] "George" my.list[[2]] [1] "Mary" my.list[[4]][1] [1] 4 getelement(mylist, "name") my.list$name # my.list[[1]] # my.list[[ name ]] [1] "George" my.list$wife # my.list[[2]] [1] "Mary" my.list$child.ages[1] # my.list[[4]][1] [1] 4 x <- "name" my.list[[x]] [1] "George" my.list[1] # 傳回 list $name [1] "George" my.list[2] $wife [1] "Mary"

38 課堂練習 6 38/60 my.list <- list(name=c("george", "John", "Tom"), wife=c("mary", "Sue", "Nico"), no.children=c(3, 2, 0), child.ages=list(c(4,7,9), c(2, 5), NA)) my.list$name [1] "George" "John" "Tom" my.list$wife [1] "Mary" "Sue" "Nico" my.list$no.children [1] my.list$name[3] [1] "Tom" my.list$name == "John" [1] FALSE TRUE FALSE my.list$child.ages [[1]] [1] [[2]] [1] 2 5 [[3]] [1] NA my.list$child.ages[2] [[1]] [1] 2 5 my.list$child.ages[[2]] [1] 2 5 my.list$child.ages[2][1] [[1]] [1] 2 5 my.list$child.ages[[2]][1] [1] 2 my.list$child.ages[[2]][2] [1] 5 length(my.list) [1] 4 my.list[[c(2, 3)]] [1] "Nico" my.list[c(2, 3)] $wife [1] "Mary" "Sue" "Nico" $no.children [1] 3 2 0

39 資料框 (Data Frame) 39/60 A data frame is a list with class data.frame. Regarded as a matrix with column possibly of differing modes and attributes. my.matrix <- matrix(1:15, ncol=3) my.matrix [,1] [,2] [,3] [1,] [2,] [3,] [4,] [5,] my.data <- data.frame(my.matrix) my.data X1 X2 X my.data[1, ] X1 X2 X my.data[2, 3] [1] 12 my.data$x1 [1] my.data[, "X1"] [1] my.data["x1"] X rownames(my.data) [1] "1" "2" "3" "4" "5" row.names(my.data) [1] "1" "2" "3" "4" "5" colnames(my.data) [1] "X1" "X2" "X3" names(my.data) [1] "X1" "X2" "X3"

40 資料框 (Data Frame) 40/60 rownames(my.data) <- c(paste("s", 1:5, sep=".")) colnames(my.data) <- c("a1", "A2", "A3") my.data A1 A2 A3 s s s s s subjects <-c ('Chinese', 'Math', 'English') scores <- c(50, 90, 61) pass <- scores = 60 student <- data.frame(subjects, scores, pass) student subjects scores pass 1 Chinese 50 FALSE 2 Math 90 TRUE 3 English 61 TRUE attach(my.data) A1 [1] A2 [1] A3 [1] detach() A1 Error: object "A1" not found student["2",] # use row names to extract records for no.2 subjects scores pass 2 Math 90 TRUE student[,"scores"] # use column names to extract values for "scores" [1]

41 列資料選取 41/60 index.1 <- iris[, "Species"] == "virginica" iris[index.1, ] Sepal.Length Sepal.Width Petal.Length Petal.Width Species virginica virginica... iris[species == "virginica",] Sepal.Length Sepal.Width Petal.Length Petal.Width Species virginica virginica... iris[!(species == "virginica"),] Sepal.Length Sepal.Width Petal.Length Petal.Width Species setosa setosa... m <- mean(iris$sepal.length) index.3 <- iris[, "Sepal.Length"] m iris[index.3, ] Sepal.Length Sepal.Width Petal.Length Petal.Width Species versicolor versicolor...

42 data.frame 欄位名稱 42/60 # data.frame 出來的資料欄位名稱, 會根據 input 所放是何種類別物件有關 x1 <- rnorm(5) x2 <- rnorm(5) x1 [1] class(x1) [1] "numeric" data.frame(var1=x1, Var2=x2) Var1 Var y1 <- data.frame(rnorm(5)) y2 <- data.frame(rnorm(5)) y1 rnorm class(y1) [1] "data.frame" data.frame(var1=y1, Var2=y2) rnorm.5. rnorm

43 課堂練習 43/60 class(iris) [1] "data.frame" head(iris, 3) Sepal.Length Sepal.Width Petal.Length Petal.Width Species setosa setosa setosa x1 <- iris[1] head(x1) Sepal.Length class(x1) [1] "data.frame" x2 <- iris[[1]] head(x2) [1] class(x2) [1] "numeric" x3 <- iris["sepal.length"] class(x3) [1] "data.frame" x4 <- iris[, "Sepal.Length"] class(x4) [1] "numeric" iris.copy <- iris iris.copy[3] <- NULL head(iris.copy, 3) Sepal.Length Sepal.Width Petal.Width Species setosa setosa setosa iris.copy <- iris iris.copy[[3]] <- NULL head(iris.copy, 3) Sepal.Length Sepal.Width Petal.Width Species setosa setosa setosa iris$species NULL iris$species [1] setosa setosa setosa... [145] virginica virginica virginica Levels: setosa versicolor virginica

44 課堂練習 : data.frame 的變數是一矩陣類別 44/60 iris.range <- aggregate(iris[, 1:4], by=list(iris[, 5]), range) str(iris.range) 'data.frame': 3 obs. of 5 variables: $ Group.1 : Factor w/ 3 levels "setosa","versicolor",..: $ Sepal.Length: num [1:3, 1:2] $ Sepal.Width : num [1:3, 1:2] $ Petal.Length: num [1:3, 1:2] $ Petal.Width : num [1:3, 1:2] iris.range Group.1 Sepal.Length.1 Sepal.Length.2 Sepal.Width.1 Sepal.Width.2 Petal.Length.1 Petal.Length.2 Petal.Width.1 Petal.Width.2 1 setosa versicolor virginica class(iris.range) [1] "data.frame" iris.range$sepal.length [,1] [,2] [1,] [2,] [3,] class(iris.range$sepal.length) [1] "matrix" dim(iris.range) [1] 3 5 iris.range[,1:3] Group.1 Sepal.Length.1 Sepal.Length.2 Sepal.Width.1 Sepal.Width.2 1 setosa versicolor virginica

45 日期 Dates 45/60 R 以 "Date" 類別表示 ( 不包括時間 ) 日期 : 年月日 Internally, Date objects are stored as the number of days since January 1, 1970, using negative numbers for earlier dates. The as.numeric function can be used to convert a Date object to its internal form. as.date(" ") [1] " " as.date("2019/02/17") [1] " " as.date(1000, origin = " ") [1] " " as.date("2/15/2011", format = "%m/%d/%y") [1] " " as.date("april 26, 1993", format = "%B %d, %Y") [1] " " as.date("22jun01", format = "%d%b%y") [1] " " seq(as.date(' '), by = 'days', length = 10) (lct <- Sys.getlocale("LC_TIME")) [1] "C" Sys.setlocale("LC_TIME", "C") [1] "C" [1] " " " " " " " " " " " " " " [8] " " " " " " seq(as.date(' '), to = as.date(' '), by='2 weeks') [1] " " " " " " " " " "

46 日期時間 46/60 R 的 " 時間 " 用 "POSIXct" 或 "POSIXlt" 類別表示, 內部時間是以 "1970 年 1 月 1 日 " 起至今的秒數表示 (UTC, Universal Time, Coordinated, 世界協調時間 ) (GMT, Greenwich Mean Time, 格林威治標準時間 ) Sys.time() [1] " :16:07 台北標準時間 " # extract date substr(as.character(sys.time()), 1, 10) [1] " " # extract time substr(as.character(sys.time()), 12, 19) [1] "21:16:07" date() [1] "Tue Oct 14 21:16: " now <- Sys.time() as.posixct(now) [1] " :46:44 CST" as.posixlt(now) [1] " :46:44 CST" class(now) [1] "POSIXct" "POSIXt" sec, min, hour, mday (# day number within the month), mon (#January=0), year (#+1900), wday (#day of the week starting at 0=sunday), yday (#day of the year after 1 january=0) my.date <- as.posixlt(sys.time()) my.date [1] " :18:31 台北標準時間 " my.date$sec [1] my.date$min [1] 18 my.date$hour [1] 21 my.date$mday [1] 14 my.date$mon [1] 9 my.date$year [1] 2028 my.date$wday [1] 2 my.date$yday [1] 287

47 POSIXlt / POSIXct 類別 47/60 Functions to convert between character representations and objects of classes "POSIXlt" and "POSIXct" representing calendar dates and times. Character input is first converted to class "POSIXlt" by strptime. Numeric input is first converted to "POSIXct". Any conversion that needs to go between the two date-time classes requires a time zone: conversion from "POSIXlt" to "POSIXct" will validate times in the selected time zone. as.posixct(" :59:59", format = "%Y-%m-%d %H:%M:%S", tz = "UTC") [1] " :59:59 UTC" as.posixlt(sys.time(), "GMT") [1] " :17:45 GMT"

48 strptime {base}: Date-time Conversion Functions to and from Character 48/60 x1 <- c(" ", " ", " ") strptime(x1, format="%y%m%d") [1] " CST" " CST" " CST" x2 <- c("27/02/2004", "27/02/2005", "14/01/2003") strptime(x2, format="%d/%m/%y") [1] " CST" " CST" " CST" x3 <- c("1jan1960", "2jan1960", "31mar1960", "30jul1960") strptime(x3, "%d%b%y") [1] " CST" " CST" " CST" " CDT" dates <- c("02/27/92", "02/27/92", "01/14/92", "02/28/92", "02/01/92") times <- c("23:03:20", "22:29:56", "01:03:30", "18:21:03", "16:56:26") x <- paste(dates, times) strptime(x, "%m/%d/%y %H:%M:%S") [1] " :03:20 CST" " :29:56 CST" [3] " :03:30 CST" " :21:03 CST" [5] " :56:26 CST" See also: Lubridate Package, Chron Packag

49 時間序列物件 : ts 49/60 ts(data = NA, start = 1, end = numeric(), frequency = 1, deltat = 1, ts.eps = getoption("ts.eps"), class =, names = ) as.ts(x,...) is.ts(x) ts(1:10, frequency = 4, start = c(1959, 2)) Qtr1 Qtr2 Qtr3 Qtr my.ts <- ts(1:10, frequency = 7, start = c(12, 2)) class(my.ts) [1] "ts" print(my.ts, calendar = TRUE) p1 p2 p3 p4 p5 p6 p gnp <- ts(cumsum(1+round(rnorm(100), 2)), start = c(1954, 7), frequency = 12) gnp Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec plot(gnp)

50 Multivariate ts 50/60 z <- ts(matrix(rnorm(300), 100, 3), start = c(1961, 1), frequency = 12) head(z, 3) Series 1 Series 2 Series 3 [1,] [2,] [3,] tail(z, 3) Series 1 Series 2 Series 3 [98,] [99,] [100,] class(z) [1] "mts" "ts" "matrix" plot(z) plot(z, plot.type = "single", lty = 1:3)

51 mode(object): 物件的模式 51/60 In R every "object" has a mode and a class. The former represents how an object is stored in memory (numeric, character, list and function) while the later represents its abstract type. Mode: "logical", "integer", "double", "complex", "raw", "character", "list", "expression", "name", "symbol" and "function". mode(object) Vector must have their values all of the same mode. Empty character string vector: character(0). Empty numeric vector: numeric(0). NOTE: Lists are of mode list. There are ordered sequences of objects which individually can be of any mode. (z <- 0:9) [1] mode(z) [1] "numeric" (digits <- as.character(z)) [1] "0" "1" "2" "3" "4" "5" "6" "7" "8" "9" mode(digits) [1] "character" (d <- as.integer(digits)) [1] mode(d) [1] "numeric" (x <- z[1:5]3) [1] FALSE FALSE FALSE FALSE TRUE mode(x) [1] "logical"

52 class(object): 物件的類別 52/60 For simple vector, mode=class: numeric, logical, character, list. matrix, array, factor, data.frame x1 <- 10 class(x1) [1] "numeric" (x2 <- seq(1, 10, 2)) [1] class(x2) [1] "numeric" my.f <- formula(iris$sepal.length ~ iris$sepal.width) class(my.f) [1] "formula" class(lm(my.f)) [1] "lm" class(aov(my.f)) [1] "aov" "lm" class(iris) [1] "data.frame" (iris.sub <- iris[5:10, 1:4]) Sepal.Length Sepal.Width Petal.Length Petal.Width class(iris.sub) [1] "data.frame" class(as.matrix(iris.sub)) [1] "matrix" as.list(iris.sub) $Sepal.Length [1] $Sepal.Width [1] $Petal.Length [1] $Petal.Width [1] class(as.list(iris.sub)) [1] "list"

53 class(object): 物件的類別 53/60 ex1 <- expression(1 + 0:9) # expression object ex1 expression(1 + 0:9) eval(ex1) [1] class(ex1) [1] "expression" hi <- function(){ + cat("hello world!\n") + } hi() hello world! class(hi) # function object [1] "function" # data frames are stored in memory as list but they are wrapped into data.frame objects. d <- data.frame(v1 = c(1,2)) class(d) [1] "data.frame" mode(d) [1] "list" typeof(d) [1] "list" (r.dates <- strptime(c("27/02/2004", "27/02/2005"), format="%d/%m/%y")) [1] " CST" " CST" class(r.dates) [1] "POSIXlt" "POSIXt" "There is a special object called NULL. It is used whenever there is a need to indicate or specify that an object is absent. It should not be confused with a vector or list of zero length. The NULL object has no type and no modifiable properties. There is only one NULL object in R, to which all instances refer. To test for NULL use is.null. You cannot set attributes on NULL. "

54 attributes(object): 物件的屬性 54/60 All objects except NULL can have one or more attributes attached to them. Select a specific attribute attr(object, name) Set a specific attribute attr(z, dim ) <- c(10, 10) x <- matrix(1:10, ncol=2) x [,1] [,2] [1,] 1 6 [2,] 2 7 [3,] 3 8 [4,] 4 9 [5,] 5 10 attributes(x) $dim [1] 5 2 attr(x, "dim") [1] 5 2 dim(x) [1] 5 2 x <- data.frame(matrix(1:10, ncol=2)) x X1 X attributes(x) $names [1] "X1" "X2" $row.names [1] $class [1] "data.frame" attr(x, "names") [1] "X1" "X2" names(x) [1] "X1" "X2" gender.f [1] 女女男女男男男男女女男 Levels: 女男 str(gender.f) Factor w/ 2 levels " 女 "," 男 ": class(gender.f) [1] "factor" attributes(gender.f) $levels [1] " 女 " " 男 " $class [1] "factor"

55 length(object): 物件的長度 55/60 beta <- c(1, 3, 5, 2, 4, 6, 11, NA, NA, 22) length(beta) [1] 10 length(beta[!is.na(beta)]) [1] 8 e <- numeric() # empty object e[3] <- 17 length(e) [1] 3 e [1] NA NA 17 (alpha <- numeric(10)) [1] length(alpha) [1] 10 alpha <- alpha[2*1:5] length(alpha) [1] 5 length(alpha) <- 3 alpha [1] mye <- expression(x, {y <- x^2; y+2}, x^y) length(mye) [1] 3 str(mye) expression(x, { y <- x^2 y + 2 }, x^y) myf <- formula(y ~ x1 + x2 + x3) length(myf) [1] 3 str(myf) Class 'formula' language y ~ x1 + x2 + x3..- attr(*, ".Environment")=<environment: R_GlobalEnv myf[1] `~`() myf[2] y() myf[3] (x1 + x2 + x3)() myf[4] Error in if (length(ans) == 0L... 需要 TRUE/FALSE 值的地方有缺值 mye[1] expression(x) mye[2] expression({ y <- x^2 y + 2 }) mye[3] expression(x^y) mye[4] expression(null)

56 str(object): 物件之結構 56/60 x <- 1:12 str(x) int [1:12] ch <- letters[1:12] str(ch) chr [1:12] "a" "b" "c" "d" "e" "f" "g" "h" "i" "j" "k" "l" str(iris) 'data.frame': 150 obs. of 5 variables: $ Sepal.Length: num $ Sepal.Width : num $ Petal.Length: num $ Petal.Width : num $ Species : Factor w/ 3 levels "setosa","versicolor",..: str(ls) # try str(str) function (name, pos = -1L, envir = as.environment(pos), all.names = FALSE, pattern, sorted = TRUE) str(str) function (object,...) myp <- plot(iris[,1], iris[,2]) str(myp) NULL (x <- as.date(" ")) [1] " " str(x) Date[1:1], format: " " (y <- strptime("27/02/2004", format="%d/%m/%y")) [1] " CST" str(y) POSIXlt[1:1], format: " "

57 str(object): 物件之結構 57/60 my.f <- iris$sepal.length ~ iris$sepal.width my.f iris$sepal.length ~ iris$sepal.width str(my.f) Class 'formula' language iris$sepal.length ~ iris$sepal.width..- attr(*, ".Environment")=<environment: R_GlobalEnv my.lm <- lm(my.f) my.lm Call: lm(formula = my.f) Coefficients: (Intercept) iris$sepal.width str(my.lm) List of 12 $ coefficients : Named num [1:2] $ qr :List of $ tol : num 1e my.lm$qr$tol [1] 1e-07 attr(my.lm$terms, "variables") list(iris$sepal.length, iris$sepal.width) $ terms :Classes 'terms', 'formula' language iris$sepal.length ~ iris$sepal.width....- attr(*, "variables")= language list(iris$sepal.length, iris$sepal.width)... - attr(*, "class")= chr "lm"

58 str(object): 物件之結構 58/60 my.lm.s <- summary(my.lm) my.lm.s Call: lm(formula = my.f) Residuals: Min 1Q Median 3Q Max mye <- expression(x, {y <- x^2; y+2}, x^y) mye expression(x, { y <- x^2 y + 2 }, x^y) Coefficients: Estimate Std. Error t value Pr( t ) (Intercept) <2e-16 *** iris$sepal.width Signif. codes: 0 *** ** 0.01 * Residual standard error: on 148 degrees of freedom Multiple R-squared: , Adjusted R-squared: F-statistic: on 1 and 148 DF, p-value: str(my.lm.s) List of 11 $ call : language lm(formula = my.f) $ terms :Classes 'terms', 'formula' language iris$sepal.length ~ iris$sepal.width....- attr(*, "variables")= language list(iris$sepal.length, iris$sepal.width)....- attr(*, "factors")= int [1:2, 1] attr(*, "class")= chr "summary.lm"

59 物件屬性強制轉換 (Coercing) 59/60 as.numeric(factor(c( a, b, c ))) as.numeric(c( a, b, c )) #don t work

60 資料類別 / 格式轉換 60/60 # converting rows of a matrix to elements of a list xy.matrix <- cbind(c(1, 2, 3), c(15, 16, 17)) xy.matrix [,1] [,2] [1,] 1 15 [2,] 2 16 [3,] 3 17 class(xy.matrix) [1] "matrix" xy.df <- data.frame(t(xy.location)) xy.df X1 X2 X class(xy.df) [1] "data.frame" xy.list <- as.list(xy.df) xy.list $X1 [1] 1 15 $X2 [1] 2 16 $X3 [1] 3 17 class(xy.list) [1] "list" Titanic,, Age = Child, Survived = No Sex Class Male Female 1st 0 0 2nd 0 0 3rd Crew 0 0,, Age = Adult, Survived = No Sex Class Male Female... class(titanic) [1] "table" data.frame(titanic) Class Sex Age Survived Freq 1 1st Male Child No 0 2 2nd Male Child No 0 3 3rd Male Child No 35 4 Crew Male Child No 0...

Microsoft Word - AEL CH12_彩色.doc

Microsoft Word - AEL CH12_彩色.doc L e s s o n R R Exploratory Data Analysis EDA R 12-1 Data Frame nrow() ncol() dim() > nrow(iris) # iris [1] 150 > ncol(iris) # iris [1] 5 > dim(iris) # iris [1] 150 5 nrow() number of rows ncol() number

More information

Improved Preimage Attacks on AES-like Hash Functions: Applications to Whirlpool and Grøstl

Improved Preimage Attacks on AES-like Hash Functions: Applications to Whirlpool and Grøstl SKLOIS (Pseudo) Preimage Attack on Reduced-Round Grøstl Hash Function and Others Shuang Wu, Dengguo Feng, Wenling Wu, Jian Guo, Le Dong, Jian Zou March 20, 2012 Institute. of Software, Chinese Academy

More information

Microsoft Word - Final Exam Review Packet.docx

Microsoft Word - Final Exam Review Packet.docx Do you know these words?... 3.1 3.5 Can you do the following?... Ask for and say the date. Use the adverbial of time correctly. Use Use to ask a tag question. Form a yes/no question with the verb / not

More information

Microsoft Word - p11.doc

Microsoft Word - p11.doc () 11-1 ()Classification Analysis( ) m() p.d.f prior (decision) (loss function) Bayes Risk for any decision d( ) posterior risk posterior risk Posterior prob. j (uniform prior) where Mahalanobis Distance(M-distance)

More information

1

1 015 年 ( 第 四 届 ) 全 国 大 学 生 统 计 建 模 大 赛 参 赛 论 文 论 文 名 称 : 打 车 软 件 影 响 下 的 西 安 市 出 租 车 运 营 市 场 研 究 和 统 计 分 析 参 赛 学 校 : 西 安 理 工 大 学 参 赛 队 员 : 刘 二 嫚 余 菲 王 赵 汉 指 导 教 师 : 王 金 霞 肖 燕 婷 提 交 日 期 :015 年 6 月 9 日 1

More information

6-1 Table Column Data Type Row Record 1. DBMS 2. DBMS MySQL Microsoft Access SQL Server Oracle 3. ODBC SQL 1. Structured Query Language 2. IBM

6-1 Table Column Data Type Row Record 1. DBMS 2. DBMS MySQL Microsoft Access SQL Server Oracle 3. ODBC SQL 1. Structured Query Language 2. IBM CHAPTER 6 SQL SQL SQL 6-1 Table Column Data Type Row Record 1. DBMS 2. DBMS MySQL Microsoft Access SQL Server Oracle 3. ODBC SQL 1. Structured Query Language 2. IBM 3. 1986 10 ANSI SQL ANSI X3. 135-1986

More information

untitled

untitled Co-integration and VECM Yi-Nung Yang CYCU, Taiwan May, 2012 不 列 1 Learning objectives Integrated variables Co-integration Vector Error correction model (VECM) Engle-Granger 2-step co-integration test Johansen

More information

Fun Time (1) What happens in memory? 1 i n t i ; 2 s h o r t j ; 3 double k ; 4 char c = a ; 5 i = 3; j = 2; 6 k = i j ; H.-T. Lin (NTU CSIE) Referenc

Fun Time (1) What happens in memory? 1 i n t i ; 2 s h o r t j ; 3 double k ; 4 char c = a ; 5 i = 3; j = 2; 6 k = i j ; H.-T. Lin (NTU CSIE) Referenc References (Section 5.2) Hsuan-Tien Lin Deptartment of CSIE, NTU OOP Class, March 15-16, 2010 H.-T. Lin (NTU CSIE) References OOP 03/15-16/2010 0 / 22 Fun Time (1) What happens in memory? 1 i n t i ; 2

More information

Microsoft Word doc

Microsoft Word doc 中 考 英 语 科 考 试 标 准 及 试 卷 结 构 技 术 指 标 构 想 1 王 后 雄 童 祥 林 ( 华 中 师 范 大 学 考 试 研 究 院, 武 汉,430079, 湖 北 ) 提 要 : 本 文 从 结 构 模 式 内 容 要 素 能 力 要 素 题 型 要 素 难 度 要 素 分 数 要 素 时 限 要 素 等 方 面 细 致 分 析 了 中 考 英 语 科 试 卷 结 构 的

More information

(baking powder) 1 ( ) ( ) 1 10g g (two level design, D-optimal) 32 1/2 fraction Two Level Fractional Factorial Design D-Optimal D

(baking powder) 1 ( ) ( ) 1 10g g (two level design, D-optimal) 32 1/2 fraction Two Level Fractional Factorial Design D-Optimal D ( ) 4 1 1 1 145 1 110 1 (baking powder) 1 ( ) ( ) 1 10g 1 1 2.5g 1 1 1 1 60 10 (two level design, D-optimal) 32 1/2 fraction Two Level Fractional Factorial Design D-Optimal Design 1. 60 120 2. 3. 40 10

More information

untitled

untitled 1 2 3 4 5 A 800 700 600 500 400 300 200 100 0-100 10000 9500 9000 8500 8000 7500 7000 6500 6000 2006.1-2007.5 A 1986.1-1991.12 6 7 6 27 WIND A 52.67 2007 44 8 60 55 50 45 40 35 30 25 20 15 10 2001-05 2002-02

More information

穨control.PDF

穨control.PDF TCP congestion control yhmiu Outline Congestion control algorithms Purpose of RFC2581 Purpose of RFC2582 TCP SS-DR 1998 TCP Extensions RFC1072 1988 SACK RFC2018 1996 FACK 1996 Rate-Halving 1997 OldTahoe

More information

2-2

2-2 ... 2-1... 2-2... 2-6... 2-9... 2-12... 2-13 2005 1000 2006 20083 2006 2006 2-1 2-2 2005 2006 IMF 2005 5.1% 4.3% 2006 2005 3.4% 0.2% 2006 2005 911 2005 2006 2-3 2006 2006 8.5% 1.7 1.6 1.2-0.3 8.3 4.3 3.2

More information

2015年4月11日雅思阅读预测机经(新东方版)

2015年4月11日雅思阅读预测机经(新东方版) 剑 桥 雅 思 10 第 一 时 间 解 析 阅 读 部 分 1 剑 桥 雅 思 10 整 体 内 容 统 计 2 剑 桥 雅 思 10 话 题 类 型 从 以 上 统 计 可 以 看 出, 雅 思 阅 读 的 考 试 话 题 一 直 广 泛 多 样 而 题 型 则 稳 中 有 变 以 剑 桥 10 的 test 4 为 例 出 现 的 三 篇 文 章 分 别 是 自 然 类, 心 理 研 究 类,

More information

國 立 政 治 大 學 教 育 學 系 2016 新 生 入 學 手 冊 目 錄 表 11 國 立 政 治 大 學 教 育 學 系 博 士 班 資 格 考 試 抵 免 申 請 表... 46 論 文 題 目 申 報 暨 指 導 教 授... 47 表 12 國 立 政 治 大 學 碩 博 士 班 論

國 立 政 治 大 學 教 育 學 系 2016 新 生 入 學 手 冊 目 錄 表 11 國 立 政 治 大 學 教 育 學 系 博 士 班 資 格 考 試 抵 免 申 請 表... 46 論 文 題 目 申 報 暨 指 導 教 授... 47 表 12 國 立 政 治 大 學 碩 博 士 班 論 國 立 政 治 大 學 教 育 學 系 2016 新 生 入 學 手 冊 目 錄 一 教 育 學 系 簡 介... 1 ( 一 ) 成 立 時 間... 1 ( 二 ) 教 育 目 標 與 發 展 方 向... 1 ( 三 ) 授 課 師 資... 2 ( 四 ) 行 政 人 員... 3 ( 五 ) 核 心 能 力 與 課 程 規 劃... 3 ( 六 ) 空 間 環 境... 12 ( 七 )

More information

Python a p p l e b e a r c Fruit Animal a p p l e b e a r c 2-2

Python a p p l e b e a r c Fruit Animal a p p l e b e a r c 2-2 Chapter 02 變數與運算式 2.1 2.1.1 2.1.2 2.1.3 2.1.4 2.2 2.2.1 2.2.2 2.2.3 type 2.2.4 2.3 2.3.1 print 2.3.2 input 2.4 2.4.1 2.4.2 2.4.3 2.4.4 2.4.5 + 2.4.6 Python Python 2.1 2.1.1 a p p l e b e a r c 65438790

More information

Microsoft PowerPoint - STU_EC_Ch08.ppt

Microsoft PowerPoint - STU_EC_Ch08.ppt 樹德科技大學資訊工程系 Chapter 8: Counters Shi-Huang Chen Fall 2010 1 Outline Asynchronous Counter Operation Synchronous Counter Operation Up/Down Synchronous Counters Design of Synchronous Counters Cascaded Counters

More information

89???????q?l?????T??

89???????q?l?????T?? 華 興 電 子 報 第 89 期 民 國 102 年 01 月 12 日 出 刊 網 址 :www.hhhs.tp.edu.tw 發 行 人 : 高 宏 煙 總 編 輯 : 蕭 慶 智 董 大 鋼 許 莙 葇 王 雅 慧 主 編 : 賴 怡 潔 編 輯 群 : 周 慧 婷 陳 怡 君 陳 玫 禎 楊 雅 惠 郭 孟 平 伍 玉 琪 林 冠 良 林 淑 惠 賴 姿 潔 王 思 方 102 年 01 月

More information

科学计算的语言-FORTRAN95

科学计算的语言-FORTRAN95 科 学 计 算 的 语 言 -FORTRAN95 目 录 第 一 篇 闲 话 第 1 章 目 的 是 计 算 第 2 章 FORTRAN95 如 何 描 述 计 算 第 3 章 FORTRAN 的 编 译 系 统 第 二 篇 计 算 的 叙 述 第 4 章 FORTRAN95 语 言 的 形 貌 第 5 章 准 备 数 据 第 6 章 构 造 数 据 第 7 章 声 明 数 据 第 8 章 构 造

More information

spss.doc

spss.doc SPSS 8 8.1 K-Means Cluster [ 8-1] 1962 1988 8-1 2 5 31 3 7 20 F2-F3 2 3 F3-F4 3 4 109 8 8-1 2 3 2 3 F2-F3 F3-F4 1962 344 3333 29 9 9.69 1.91 1963 121 1497 27 19 12.37 1.34 1964 187 1813 32 18 9.70 1.06

More information

投资高企 把握3G投资主题

投资高企 把握3G投资主题 行 业 研 究 东 兴 证 券 股 份 有 限 公 司 证 券 研 究 报 告 维 持 推 荐 白 酒 行 业 食 品 饮 料 行 业 2016 年 第 21 周 周 报 投 资 摘 要 : 上 周 市 场 表 现 和 下 周 投 资 策 略 上 周 食 品 饮 料 行 业 指 数 下 跌 0.89%, 跑 输 沪 深 300 指 数 1 个 百 分 点 食 品 饮 料 细 分 行 业 1 个 上

More information

Microsoft Word - (web)_F.1_Notes_&_Application_Form(Chi)(non-SPCCPS)_16-17.doc

Microsoft Word - (web)_F.1_Notes_&_Application_Form(Chi)(non-SPCCPS)_16-17.doc 聖 保 羅 男 女 中 學 學 年 中 一 入 學 申 請 申 請 須 知 申 請 程 序 : 請 將 下 列 文 件 交 回 本 校 ( 麥 當 勞 道 33 號 ( 請 以 A4 紙 張 雙 面 影 印, 並 用 魚 尾 夾 夾 起 : 填 妥 申 請 表 並 貼 上 近 照 小 學 五 年 級 上 下 學 期 成 績 表 影 印 本 課 外 活 動 表 現 及 服 務 的 證 明 文 件 及

More information

BC04 Module_antenna__ doc

BC04 Module_antenna__ doc http://www.infobluetooth.com TEL:+86-23-68798999 Fax: +86-23-68889515 Page 1 of 10 http://www.infobluetooth.com TEL:+86-23-68798999 Fax: +86-23-68889515 Page 2 of 10 http://www.infobluetooth.com TEL:+86-23-68798999

More information

untitled

untitled 不 料 料 例 : ( 料 ) 串 度 8 年 數 串 度 4 串 度 數 數 9- ( ) 利 數 struct { ; ; 數 struct 數 ; 9-2 數 利 數 C struct 數 ; C++ 數 ; struct 省略 9-3 例 ( 料 例 ) struct people{ char name[]; int age; char address[4]; char phone[]; int

More information

C/C++语言 - C/C++数据

C/C++语言 - C/C++数据 C/C++ C/C++ Table of contents 1. 2. 3. 4. char 5. 1 C = 5 (F 32). 9 F C 2 1 // fal2cel. c: Convert Fah temperature to Cel temperature 2 # include < stdio.h> 3 int main ( void ) 4 { 5 float fah, cel ;

More information

lnag_ch_v2.01.doc

lnag_ch_v2.01.doc 1. 2. 3. 4. 5. 6. 7. 8. 9. 10. 11. % Any line starting with "%" is a comment. % "\" (backslash) is a special Latex character which introduces a Latex %

More information

目 录 1 新 闻 政 策 追 踪... 4 1.1 住 建 部 : 坚 持 因 城 施 策 完 善 房 地 产 宏 观 调 控... 4 2 行 业 数 据 追 踪... 4 2.1 限 购 政 策 落 地, 新 房 成 交 回 落... 4 2.2 库 存 微 降, 一 线 去 化 表 现 稍

目 录 1 新 闻 政 策 追 踪... 4 1.1 住 建 部 : 坚 持 因 城 施 策 完 善 房 地 产 宏 观 调 控... 4 2 行 业 数 据 追 踪... 4 2.1 限 购 政 策 落 地, 新 房 成 交 回 落... 4 2.2 库 存 微 降, 一 线 去 化 表 现 稍 Sep/15 Oct/15 Nov/15 Dec/15 Jan/16 Feb/16 Mar/16 Apr/16 May/16 Jun/16 Jul/16 Aug/16 房 地 产 行 业 行 业 研 究 - 行 业 周 报 行 业 评 级 : 增 持 报 告 日 期 :216-9-14 4% 3% 2% 1% % -1% -2% 沪 深 3 SW 房 地 产 研 究 员 : 宫 模 恒 551-65161836

More information

入學考試網上報名指南

入學考試網上報名指南 入 學 考 試 網 上 報 名 指 南 On-line Application Guide for Admission Examination 16/01/2015 University of Macau Table of Contents Table of Contents... 1 A. 新 申 請 網 上 登 記 帳 戶 /Register for New Account... 2 B. 填

More information

( Version 0.4 ) 1

( Version 0.4 ) 1 ( Version 0.4 ) 1 3 3.... 3 3 5.... 9 10 12 Entities-Relationship Model. 13 14 15.. 17 2 ( ) version 0.3 Int TextVarchar byte byte byte 3 Id Int 20 Name Surname Varchar 20 Forename Varchar 20 Alternate

More information

Sea of Japan Hokkaido Okhotsk Sea Study area Number of fish released (thousand) 120,000 100,000 80,000 60,000 40,000 20,000 0 1991 1993 1995 1997 1999 2001 Year Fish released in rivers Fish released from

More information

coverage2.ppt

coverage2.ppt Satellite Tool Kit STK/Coverage STK 82 0715 010-68745117 1 Coverage Definition Figure of Merit 2 STK Basic Grid Assets Interval Description 3 Grid Global Latitude Bounds Longitude Lines Custom Regions

More information

LEETCODE leetcode.com 一 个 在 线 编 程 网 站, 收 集 了 IT 公 司 的 面 试 题, 包 括 算 法, 数 据 库 和 shell 算 法 题 支 持 多 种 语 言, 包 括 C, C++, Java, Python 等 2015 年 3 月 份 加 入 了 R

LEETCODE leetcode.com 一 个 在 线 编 程 网 站, 收 集 了 IT 公 司 的 面 试 题, 包 括 算 法, 数 据 库 和 shell 算 法 题 支 持 多 种 语 言, 包 括 C, C++, Java, Python 等 2015 年 3 月 份 加 入 了 R 用 RUBY 解 LEETCODE 算 法 题 RUBY CONF CHINA 2015 By @quakewang LEETCODE leetcode.com 一 个 在 线 编 程 网 站, 收 集 了 IT 公 司 的 面 试 题, 包 括 算 法, 数 据 库 和 shell 算 法 题 支 持 多 种 语 言, 包 括 C, C++, Java, Python 等 2015 年 3 月 份

More information

PowerPoint Presentation

PowerPoint Presentation 推 票 蕴 含 的 投 资 机 会 卖 方 分 析 师 重 点 报 告 效 应 研 究 证 券 分 析 师 刘 均 伟 A0230511040041 夏 祥 全 A0230513070002 2014.4 主 要 内 容 1. 卖 方 分 析 师 推 票 的 时 滞 性 蕴 含 了 事 件 投 资 机 会 2. 卖 方 分 析 师 重 点 报 告 首 次 效 应 3. 卖 方 分 析 师 重 点 报

More information

ENGG1410-F Tutorial 6

ENGG1410-F Tutorial 6 Jianwen Zhao Department of Computer Science and Engineering The Chinese University of Hong Kong 1/16 Problem 1. Matrix Diagonalization Diagonalize the following matrix: A = [ ] 1 2 4 3 2/16 Solution The

More information

Preface This guide is intended to standardize the use of the WeChat brand and ensure the brand's integrity and consistency. The guide applies to all d

Preface This guide is intended to standardize the use of the WeChat brand and ensure the brand's integrity and consistency. The guide applies to all d WeChat Search Visual Identity Guidelines WEDESIGN 2018. 04 Preface This guide is intended to standardize the use of the WeChat brand and ensure the brand's integrity and consistency. The guide applies

More information

Lorem ipsum dolor sit amet, consectetuer adipiscing elit

Lorem ipsum dolor sit amet, consectetuer adipiscing elit English for Study in Australia 留 学 澳 洲 英 语 讲 座 Lesson 3: Make yourself at home 第 三 课 : 宾 至 如 归 L1 Male: 各 位 朋 友 好, 欢 迎 您 收 听 留 学 澳 洲 英 语 讲 座 节 目, 我 是 澳 大 利 亚 澳 洲 广 播 电 台 的 节 目 主 持 人 陈 昊 L1 Female: 各 位

More information

untitled

untitled 29 12 1 21-53519888-1922 Ch57261821@yahoo.com.cn 11 12.78 1.6 95.36 1 114.88 6 3 6% 8 35.% 3.% 25.% 2.% 15.% 1.% 5.%.% -5.% -1.% -15.% 9-6 9-6 9-7 9-7 9-7 9-8 9-8 9-8 9-9 9-9 9-1 9-1 9-11 9-11 9-11 9-12

More information

(Microsoft PowerPoint - 2011 [L So] \272C\251\312\252\375\266\353\251\312\252\315\257f [\254\333\256e\274\322\246\241])

(Microsoft PowerPoint - 2011 [L So] \272C\251\312\252\375\266\353\251\312\252\315\257f [\254\333\256e\274\322\246\241]) 慢 性 阻 塞 性 肺 病 (COPD) 冬 令 殺 手 冬 令 殺 手 蘇 潔 瑩 醫 生 東 區 尤 德 夫 人 那 打 素 醫 院 內 科 部 呼 吸 科 副 顧 問 醫 生 慢 性 阻 塞 性 肺 病 (COPD) 慢 性 阻 塞 性 肺 病 簡 稱 慢 阻 肺 病, 主 要 包 括 慢 性 支 氣 管 炎 和 肺 氣 腫 兩 種 情 況 患 者 的 呼 吸 道 受 阻, 以 致 氣 流 不

More information

<4D6963726F736F667420576F7264202D20D6D0D2A9B2C4D0D0D2B5C9EEB6C8D1D0BEBFB1A8B8E62DD4A4BCC6BCD2D6D6D6D0D2A9B2C4BCDBB8F1BDABCFC2BDB5A3ACD3D0CDFBB3C9CEAA3133C4EACDB6D7CAD6F7CCE2>

<4D6963726F736F667420576F7264202D20D6D0D2A9B2C4D0D0D2B5C9EEB6C8D1D0BEBFB1A8B8E62DD4A4BCC6BCD2D6D6D6D0D2A9B2C4BCDBB8F1BDABCFC2BDB5A3ACD3D0CDFBB3C9CEAA3133C4EACDB6D7CAD6F7CCE2> 证 券 研 究 报 告 行 业 深 度 报 告 日 用 消 费 医 药 推 荐 ( 维 持 ) 预 计 家 种 中 药 材 价 格 将 下 降, 有 望 成 为 3 年 投 资 主 题 22 年 8 月 4 日 中 药 材 行 业 深 度 研 究 报 告 上 证 指 数 236 行 业 规 模 占 比 % 股 票 家 数 ( 只 ) 52 7.2 总 市 值 ( 亿 元 ) 278 4.9 流 通

More information

宏碩-觀光指南coverX.ai

宏碩-觀光指南coverX.ai Time for Taiwan Taiwan-The Heart of Asia Time for Taiwan www.taiwan.net.tw Part 1 01 CONTENTS 04 Part 1 06 Part 2 GO 06 14 22 30 38 Part 3 200+ 02 Part 1 03 1 2 3 4 5 6 04 Jan Feb Mar Apr May Jun Part

More information

untitled

untitled Visual Basic 2005 (VB.net 2.0) hana@arbor.ee.ntu.edu.tw 立 六 數 串 數數 數 數 串 數 串 數 Len( 串 ) 串 度 Len( 123 )=3 LCase( 串 ) 串 LCase( AnB123 ) anb123 UCase( 串 ) 串 UCase( AnB123 ) ANB123 串 數 InStr([ ], 串 1, 串 2[,

More information

C/C++ 语言 - 循环

C/C++ 语言 - 循环 C/C++ Table of contents 7. 1. 2. while 3. 4. 5. for 6. 8. (do while) 9. 10. (nested loop) 11. 12. 13. 1 // summing.c: # include int main ( void ) { long num ; long sum = 0L; int status ; printf

More information

PowerPoint Presentation

PowerPoint Presentation TOEFL Practice Online User Guide Revised September 2009 In This Guide General Tips for Using TOEFL Practice Online Directions for New Users Directions for Returning Users 2 General Tips To use TOEFL Practice

More information

4. 每 组 学 生 将 写 有 习 语 和 含 义 的 两 组 卡 片 分 别 洗 牌, 将 顺 序 打 乱, 然 后 将 两 组 卡 片 反 面 朝 上 置 于 课 桌 上 5. 学 生 依 次 从 两 组 卡 片 中 各 抽 取 一 张, 展 示 给 小 组 成 员, 并 大 声 朗 读 卡

4. 每 组 学 生 将 写 有 习 语 和 含 义 的 两 组 卡 片 分 别 洗 牌, 将 顺 序 打 乱, 然 后 将 两 组 卡 片 反 面 朝 上 置 于 课 桌 上 5. 学 生 依 次 从 两 组 卡 片 中 各 抽 取 一 张, 展 示 给 小 组 成 员, 并 大 声 朗 读 卡 Tips of the Week 课 堂 上 的 英 语 习 语 教 学 ( 二 ) 2015-04-19 吴 倩 MarriottCHEI 大 家 好! 欢 迎 来 到 Tips of the Week! 这 周 我 想 和 老 师 们 分 享 另 外 两 个 课 堂 上 可 以 开 展 的 英 语 习 语 教 学 活 动 其 中 一 个 活 动 是 一 个 充 满 趣 味 的 游 戏, 另 外

More information

OncidiumGower Ramsey ) 2 1(CK1) 2(CK2) 1(T1) 2(T2) ( ) CK1 43 (A 44.2 ) CK2 66 (A 48.5 ) T1 40 (

OncidiumGower Ramsey ) 2 1(CK1) 2(CK2) 1(T1) 2(T2) ( ) CK1 43 (A 44.2 ) CK2 66 (A 48.5 ) T1 40 ( 35 1 2006 48 35-46 OncidiumGower Ramsey ) 2 1(CK1) 2(CK2) 1(T1) 2(T2) (93 5 28 95 1 9 ) 94 1-2 5-6 8-10 94 7 CK1 43 (A 44.2 ) CK2 66 (A 48.5 ) T1 40 (A 47.5 ) T2 73 (A 46.6 ) 3 CK2 T1 T2 CK1 2006 8 16

More information

报告的主线及研究的侧重点

报告的主线及研究的侧重点 26-11-2 862163299571 86213313733 zhouyong2@cjsc.com.cn zhoujt@cjsc.com.cn 27 7 7 25.1 6 25.12 26.5 26.11 2 2 6 7 27 7 7 ...1 2...1...2 6...3 7...4...5...7...8...11...11...13...15...18...18...18...19 7...2

More information

Microsoft PowerPoint - Lecture7II.ppt

Microsoft PowerPoint - Lecture7II.ppt Lecture 8II SUDOKU PUZZLE SUDOKU New Play Check 軟體實作與計算實驗 1 4x4 Sudoku row column 3 2 } 4 } block 1 4 軟體實作與計算實驗 2 Sudoku Puzzle Numbers in the puzzle belong {1,2,3,4} Constraints Each column must contain

More information

untitled

untitled 1 Outline 數 料 數 數 列 亂數 練 數 數 數 來 數 數 來 數 料 利 料 來 數 A-Z a-z _ () 不 數 0-9 數 不 數 SCHOOL School school 數 讀 school_name schoolname 易 不 C# my name 7_eleven B&Q new C# (1) public protected private params override

More information

K301Q-D VRT中英文说明书141009

K301Q-D VRT中英文说明书141009 THE INSTALLING INSTRUCTION FOR CONCEALED TANK Important instuction:.. Please confirm the structure and shape before installing the toilet bowl. Meanwhile measure the exact size H between outfall and infall

More information

untitled

untitled 數 Quadratic Equations 數 Contents 錄 : Quadratic Equations Distinction between identities and equations. Linear equation in one unknown 3 ways to solve quadratic equations 3 Equations transformed to quadratic

More information

國 立 屏 東 教 育 大 學 中 國 語 文 學 系 碩 士 班 碩 士 論 文 國 小 國 語 教 科 書 修 辭 格 分 析 以 南 一 版 為 例 指 導 教 授 : 柯 明 傑 博 士 研 究 生 : 鄺 綺 暖 撰 中 華 民 國 一 百 零 二 年 七 月 謝 辭 寫 作 論 文 的 日 子 終 於 畫 下 了 句 點, 三 年 前 懷 著 對 文 學 的 熱 愛, 報 考 了 中

More information

産 産 産 産 産 爲 爲 爲 爲 185 185

産 産 産 産 産 爲 爲 爲 爲 185 185 産 産 184 産 産 産 産 産 爲 爲 爲 爲 185 185 爲 爲 爲 産 爲 爲 爲 産 186 産 爲 爲 爲 爲 爲 爲 顔 爲 産 爲 187 爲 産 爲 産 爲 産 爲 爲 188 産 爲 爲 酰 酰 酰 酰 酰 酰 産 爲 爲 産 腈 腈 腈 腈 腈 爲 腈 腈 腈 腈 爲 産 189 産 爲 爲 爲 爲 19 産 爲 爲 爲 爲 爲 爲 191 産 192 産 爲 顔 爲 腈

More information

「人名權威檔」資料庫欄位建置表

「人名權威檔」資料庫欄位建置表 ( version 0.2) 1 3 3 3 3 5 6 9.... 11 Entities - Relationship Model..... 12 13 14 16 2 ( ) Int Varchar Text byte byte byte Id Int 20 Name Surname Varchar 20 Forename Varchar 20 Alternate Type Varchar 10

More information

天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 百 善 孝 為 先? 奉 養 父 母 與 接 受 子 女 奉 養 之 態 度 及 影 響 因 素 : 跨 時 趨 勢 分 析 Changes in attitude toward adult children's responsibilit

天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 百 善 孝 為 先? 奉 養 父 母 與 接 受 子 女 奉 養 之 態 度 及 影 響 因 素 : 跨 時 趨 勢 分 析 Changes in attitude toward adult children's responsibilit 天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 指 導 老 師 : 翁 志 遠 百 善 孝 為 先? 奉 養 父 母 與 接 受 子 女 奉 養 之 態 度 及 影 響 因 素 : 跨 時 趨 勢 分 析 Changes in attitude toward adult children's responsibility to financially support and to live

More information

5. 6. 310-00 7. 8. 9. 2

5. 6. 310-00 7. 8. 9. 2 Mondeo 2003-03-08 2003 / MondeoGhia-X, 3S71-9H307-FA 310-069 (23-055) ( ) 1. 310-00 2. 310-00 3. 100-02 4. 1 5. 6. 310-00 7. 8. 9. 2 10 10. 11. 12. 3 13. 1. 2. 14. 310-00 15. 4 16. 17. 18. 19. 20. ( )

More information

2 图 1 新 民 科 技 2010 年 主 营 业 务 收 入 结 构 图 2 新 民 科 技 2010 年 主 营 业 务 毛 利 结 构 印 染 加 工 10.8% 其 他 4.8% 丝 织 品 17.2% 印 染 加 工 7.8% 其 他 4.4% 丝 织 品 19.1% 涤 纶 长 丝 6

2 图 1 新 民 科 技 2010 年 主 营 业 务 收 入 结 构 图 2 新 民 科 技 2010 年 主 营 业 务 毛 利 结 构 印 染 加 工 10.8% 其 他 4.8% 丝 织 品 17.2% 印 染 加 工 7.8% 其 他 4.4% 丝 织 品 19.1% 涤 纶 长 丝 6 买 入 维 持 上 市 公 司 年 报 点 评 新 民 科 技 (002127) 证 券 研 究 报 告 化 工 - 基 础 化 工 材 料 与 制 品 2011 年 3 月 15 日 2010 年 业 绩 符 合 预 期, 增 发 项 目 投 产 在 即 基 础 化 工 行 业 分 析 师 : 曹 小 飞 SAC 执 业 证 书 编 号 :S08500210070006 caoxf@htsec.com

More information

Microsoft Word - A200810-897.doc

Microsoft Word - A200810-897.doc 基 于 胜 任 特 征 模 型 的 结 构 化 面 试 信 度 和 效 度 验 证 张 玮 北 京 邮 电 大 学 经 济 管 理 学 院, 北 京 (100876) E-mail: weeo1984@sina.com 摘 要 : 提 高 结 构 化 面 试 信 度 和 效 度 是 面 试 技 术 研 究 的 核 心 内 容 近 年 来 国 内 有 少 数 学 者 探 讨 过 基 于 胜 任 特 征

More information

Microsoft Word - template.doc

Microsoft Word - template.doc HGC efax Service User Guide I. Getting Started Page 1 II. Fax Forward Page 2 4 III. Web Viewing Page 5 7 IV. General Management Page 8 12 V. Help Desk Page 13 VI. Logout Page 13 Page 0 I. Getting Started

More information

240 生 异 性 相 吸 的 异 性 效 应 [6] 虽 然, 心 理 学 基 础 研 [7-8] 究 已 经 证 实 存 在 异 性 相 吸 异 性 相 吸 是 否 存 在 于 名 字 认 知 识 别 尚 无 报 道 本 实 验 选 取 不 同 性 别 的 名 字 作 为 刺 激 材 料, 通

240 生 异 性 相 吸 的 异 性 效 应 [6] 虽 然, 心 理 学 基 础 研 [7-8] 究 已 经 证 实 存 在 异 性 相 吸 异 性 相 吸 是 否 存 在 于 名 字 认 知 识 别 尚 无 报 道 本 实 验 选 取 不 同 性 别 的 名 字 作 为 刺 激 材 料, 通 2011 年 Journal of Capital Medical University 4月 第2 期 Apr 2011 Vol 32 No 2 基础研究 doi: 10 3969 / j issn 1006-7795 2011 02 015 人脑识别不同性别名字反应时的差异研究 高迎霄 陈昭燃 * 张明霞 ( 首都医科大学神经生物系高级脑功能中心) 摘要 目的 探讨男女对不同性别名字认知加工速度是否存在差异

More information

Microsoft Word - 第四章 資料分析

Microsoft Word - 第四章  資料分析 第 四 章 資 料 分 析 本 研 究 針 對 等 三 報, 在 馬 英 九 擔 任 台 北 市 長 台 北 市 長 兼 國 民 黨 主 席, 以 及 國 民 黨 主 席 之 從 政 階 段 中 ( 共 計 八 年 又 二 個 月 的 時 間, 共 855 則 新 聞, 其 中 179 則, 348 則, 328 則 ), 報 導 馬 英 九 新 聞 時 使 用 名 人 政 治 新 聞 框 架 之

More information

Untitled-3

Untitled-3 SEC.. Separable Equations In each of problems 1 through 8 solve the given differential equation : ü 1. y ' x y x y, y 0 fl y - x 0 fl y - x 0 fl y - x3 3 c, y 0 ü. y ' x ^ y 1 + x 3 x y 1 + x 3, y 0 fl

More information

1. 发 行 情 况 格 力 地 产 于 2014 年 12 月 25 日 发 行 9.8 亿 元 可 转 债 其 中, 原 股 东 优 先 配 售 2.1225 亿 元 (21.225 万 手 ), 占 本 次 发 行 总 量 的 21.66% 网 上 向 一 般 社 会 公 众 投 资 者 发

1. 发 行 情 况 格 力 地 产 于 2014 年 12 月 25 日 发 行 9.8 亿 元 可 转 债 其 中, 原 股 东 优 先 配 售 2.1225 亿 元 (21.225 万 手 ), 占 本 次 发 行 总 量 的 21.66% 网 上 向 一 般 社 会 公 众 投 资 者 发 衍 生 品 市 场 衍 生 品 市 场 转 债 研 究 转 债 研 究 证 券 研 究 报 告 证 券 研 究 报 告 转 债 定 价 报 告 2015 年 1 月 11 日 格 力 转 债 (110030) 上 市 定 价 分 析 公 司 资 料 : 转 债 条 款 : 发 行 日 到 期 日 期 限 转 股 期 限 起 始 转 股 日 发 行 规 模 净 利 润 2014-12-25 2019-12-24

More information

2

2 1 2 3 4 PHY (RAN1) LTE/LTE-A 6.3 Enhanced Downlink Multiple Antenna Transmission 6.3.1 CSI RS 6.4 Uplink Multiple Antenna Transmission 6.4.1 Transmission modes and Signalling requirements for SU-MIMO 6.5

More information

页码,1/6 Pegasus Parts Lists: If you have any questions or need assistance in finding a part, please just drop us a note through our Contact Us page and our experienced sales staff will assist you. Pegasus

More information

<4D6963726F736F667420576F7264202D205F4230365FB942A5CEA668B443C5E9BB73A740B5D8A4E5B8C9A552B1D0A7F75FA6BFB1A4ACFC2E646F63>

<4D6963726F736F667420576F7264202D205F4230365FB942A5CEA668B443C5E9BB73A740B5D8A4E5B8C9A552B1D0A7F75FA6BFB1A4ACFC2E646F63> 運 用 多 媒 體 製 作 華 文 補 充 教 材 江 惜 美 銘 傳 大 學 應 用 中 文 系 chm248@gmail.com 摘 要 : 本 文 旨 在 探 究 如 何 運 用 多 媒 體, 結 合 文 字 聲 音 圖 畫, 製 作 華 文 補 充 教 材 當 我 們 在 進 行 華 文 教 學 時, 往 往 必 須 透 過 教 案 設 計, 並 製 作 補 充 教 材, 方 能 使 教 學

More information

untitled

untitled 2006 6 Geoframe Geoframe 4.0.3 Geoframe 1.2 1 Project Manager Project Management Create a new project Create a new project ( ) OK storage setting OK (Create charisma project extension) NO OK 2 Edit project

More information

Chapter 9: Objects and Classes

Chapter 9: Objects and Classes Fortran Algol Pascal Modula-2 BCPL C Simula SmallTalk C++ Ada Java C# C Fortran 5.1 message A B 5.2 1 class Vehicle subclass Car object mycar public class Vehicle extends Object{ public int WheelNum

More information

天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 小 別 勝 新 婚? 久 別 要 離 婚? 影 響 遠 距 家 庭 婚 姻 感 情 因 素 之 探 討 Separate marital relations are getting better or getting worse? -Exp

天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 小 別 勝 新 婚? 久 別 要 離 婚? 影 響 遠 距 家 庭 婚 姻 感 情 因 素 之 探 討 Separate marital relations are getting better or getting worse? -Exp 天 主 教 輔 仁 大 學 社 會 學 系 學 士 論 文 小 別 勝 新 婚? 久 別 要 離 婚? 影 響 遠 距 家 庭 婚 姻 感 情 因 素 之 探 討 Separate marital relations are getting better or getting worse? -Explore the impact of emotional factors couples do not

More information

2017 CCAFL Chinese in Context

2017 CCAFL Chinese in Context Student/Registration Number Centre Number 2017 PUBLIC EXAMINATION Chinese in Context Reading Time: 10 minutes Working Time: 2 hours and 30 minutes You have 10 minutes to read all the papers and to familiarise

More information

參 加 第 二 次 pesta 的 我, 在 是 次 交 流 營 上 除 了, 與 兩 年 沒 有 見 面 的 朋 友 再 次 相 聚, 加 深 友 誼 外, 更 獲 得 與 上 屆 不 同 的 體 驗 和 經 歴 比 較 起 香 港 和 馬 來 西 亞 的 活 動 模 式, 確 是 有 不 同 特

參 加 第 二 次 pesta 的 我, 在 是 次 交 流 營 上 除 了, 與 兩 年 沒 有 見 面 的 朋 友 再 次 相 聚, 加 深 友 誼 外, 更 獲 得 與 上 屆 不 同 的 體 驗 和 經 歴 比 較 起 香 港 和 馬 來 西 亞 的 活 動 模 式, 確 是 有 不 同 特 WE ARE BOY S BRIGADE 參 加 第 二 次 pesta 的 我, 在 是 次 交 流 營 上 除 了, 與 兩 年 沒 有 見 面 的 朋 友 再 次 相 聚, 加 深 友 誼 外, 更 獲 得 與 上 屆 不 同 的 體 驗 和 經 歴 比 較 起 香 港 和 馬 來 西 亞 的 活 動 模 式, 確 是 有 不 同 特 別 之 處 如 控 制 時 間 及 人 流 方 面, 香

More information

<4D6963726F736F667420576F7264202D20CAFDBEDDCFC2D6DCB9ABB2BC20CAD0B3A1B3E5B8DFC8D4D3D0D5F0B5B42E646F63>

<4D6963726F736F667420576F7264202D20CAFDBEDDCFC2D6DCB9ABB2BC20CAD0B3A1B3E5B8DFC8D4D3D0D5F0B5B42E646F63> 2010 年 8 月 8 日 市 场 策 略 第 一 创 业 研 究 所 分 析 师 : 于 海 涛 S1080200010003 电 话 :0755-25832792 邮 件 :yuhaitao@fcsc.cn 沪 深 300 交 易 数 据 年 初 涨 跌 幅 : -18.96% 日 最 大 涨 幅 : 3.78%(5/24) 日 最 大 跌 幅 : -5.36%(4/19) A 股 基 本 数

More information

信息管理部2003

信息管理部2003 23 7 3 22 28451642 E-mail wpff@eyou.com 23 1 23 5 22 2 3 4 628 6688 866 62 52 956 46 817 912 696 792 6.5% 1: 2: -2.% -1.5% -19.% -27.6% 33.6 3.45 [2.22%] 5A:6.94 1A:9.89 2A:9.51 3A:8.44 22.14 11.23 1-1-12

More information

2015 Chinese FL Written examination

2015 Chinese FL Written examination Victorian Certificate of Education 2015 SUPERVISOR TO ATTACH PROCESSING LABEL HERE Letter STUDENT NUMBER CHINESE FIRST LANGUAGE Written examination Monday 16 November 2015 Reading time: 11.45 am to 12.00

More information

3.1 num = 3 ch = 'C' 2

3.1 num = 3 ch = 'C' 2 Java 1 3.1 num = 3 ch = 'C' 2 final 3.1 final : final final double PI=3.1415926; 3 3.2 4 int 3.2 (long int) (int) (short int) (byte) short sum; // sum 5 3.2 Java int long num=32967359818l; C:\java\app3_2.java:6:

More information

모집요강(중문)[2013후기외국인]04.26.hwp

모집요강(중문)[2013후기외국인]04.26.hwp 2013 弘 益 大 学 后 期 外 国 人 特 别 招 生 简 章 弘 益 大 学 http://ibsi.hongik.ac.kr 目 次 I 招 生 日 程 3 II 招 生 单 位 4 III 报 名 资 格 及 提 交 材 料 5 IV 录 取 方 法 8 V 报 名 程 序 9 VI 注 册 指 南 11 VII 其 它 12 附 录 提 交 材 料 表 格 外 国 人 入 学 申 请

More information

四川省普通高等学校

四川省普通高等学校 四 川 省 普 通 高 等 学 校 计 算 机 应 用 知 识 和 能 力 等 级 考 试 考 试 大 纲 (2013 年 试 行 版 ) 四 川 省 教 育 厅 计 算 机 等 级 考 试 中 心 2013 年 1 月 目 录 一 级 考 试 大 纲 1 二 级 考 试 大 纲 6 程 序 设 计 公 共 基 础 知 识 6 BASIC 语 言 程 序 设 计 (Visual Basic) 9

More information

TX-NR3030_BAS_Cs_ indd

TX-NR3030_BAS_Cs_ indd TX-NR3030 http://www.onkyo.com/manual/txnr3030/adv/cs.html Cs 1 2 3 Speaker Cable 2 HDMI OUT HDMI IN HDMI OUT HDMI OUT HDMI OUT HDMI OUT 1 DIGITAL OPTICAL OUT AUDIO OUT TV 3 1 5 4 6 1 2 3 3 2 2 4 3 2 5

More information

PowerPoint Presentation

PowerPoint Presentation ITM omputer and ommunication Technologies Lecture #4 Part I: Introduction to omputer Technologies Logic ircuit Design & Simplification ITM 計算機與通訊技術 2 23 香港中文大學電子工程學系 Logic function implementation Logic

More information

Microsoft Word - Daily160429-A _CN_.doc

Microsoft Word - Daily160429-A _CN_.doc 每 日 焦 点 中 银 国 际 证 券 研 究 报 告 指 数 表 现 收 盘 一 日 今 年 % 以 来 % 恒 生 指 数 21,388 0.1 (2.4) 恒 生 中 国 企 业 指 数 9,061 0.3 (6.2) 恒 生 香 港 中 资 企 业 指 数 3,803 (0.2) (6.1) 摩 根 士 丹 利 资 本 国 际 香 港 指 数 12,193 (0.0) 0.9 摩 根 士 丹

More information

2/80 2

2/80 2 2/80 2 3/80 3 DSP2400 is a high performance Digital Signal Processor (DSP) designed and developed by author s laboratory. It is designed for multimedia and wireless application. To develop application

More information

ebook14-4

ebook14-4 4 TINY LL(1) First F o l l o w t o p - d o w n 3 3. 3 backtracking parser predictive parser recursive-descent parsing L L ( 1 ) LL(1) parsing L L ( 1 ) L L ( 1 ) 1 L 2 L 1 L L ( k ) k L L ( 1 ) F i r s

More information

Strings

Strings Inheritance Cheng-Chin Chiang Relationships among Classes A 類 別 使 用 B 類 別 學 生 使 用 手 機 傳 遞 訊 息 公 司 使 用 金 庫 儲 存 重 要 文 件 人 類 使 用 交 通 工 具 旅 行 A 類 別 中 有 B 類 別 汽 車 有 輪 子 三 角 形 有 三 個 頂 點 電 腦 內 有 中 央 處 理 單 元 A

More information

CC213

CC213 : (Ken-Yi Lee), E-mail: feis.tw@gmail.com 9 [P.11] : Dev C++ [P.12] : http://c.feis.tw [P.13] [P.14] [P.15] [P.17] [P.23] Dev C++ [P.24] [P.27] [P.34] C / C++ [P.35] 10 C / C++ C C++ C C++ C++ C ( ) C++

More information

基金池周报

基金池周报 基 金 研 究 / 周 报 关 注 新 华 优 选 成 长 等 零 存 整 取 型 基 金 民 生 证 券 基 金 池 动 态 周 报 民 生 精 品 --- 基 金 研 究 周 报 2011 年 05 月 03 日 建 议 资 金 充 裕 渴 望 在 中 长 期 获 取 超 额 收 益 的 投 资 者 关 注 华 夏 大 盘 精 选 (000011.OF ) 大 摩 资 源 优 选 混 合 ( 163302.OF

More information

专题研究.doc

专题研究.doc 2005 2 1 14 11.2 14 15 15 14 Yunyang.zhao@morningstar.com 500 MSCI 1991 2001 53 458 115 94 24 316 26 494 125 1995 26 14 1993 1993 1997 http://cn.morningstar.com 1998 1 2001 6 2000 1993 90 2002 2001 51

More information

<4D6963726F736F667420506F776572506F696E74202D20B5DAD2BBD5C228B4F2D3A1B0E6292E707074205BBCE6C8DDC4A3CABD5D>

<4D6963726F736F667420506F776572506F696E74202D20B5DAD2BBD5C228B4F2D3A1B0E6292E707074205BBCE6C8DDC4A3CABD5D> Homeworks ( 第 三 版 ):.4 (,, 3).5 (, 3).6. (, 3, 5). (, 4).4.6.7 (,3).9 (, 3, 5) Chapter. Number systems and codes 第 一 章. 数 制 与 编 码 . Overview 概 述 Information is of digital forms in a digital system, and

More information

台灣地區同學

台灣地區同學 ACIC 台 灣 地 區 住 宿 家 庭 合 約 / 接 機 / 申 請 表 本 契 約 已 於 中 華 民 國 年 月 日 交 付 消 費 者 攜 回 審 閱 ( 契 約 審 閱 期 間 至 少 為 五 日 ) 甲 方 ( 消 費 者 ) 姓 名 : 甲 方 ( 未 滿 18 歲 代 理 人 ) 姓 名 : 國 民 身 分 證 : 國 民 身 分 證 : 電 話 : 電 話 : 住 居 所 : 住

More information

Chn 116 Neh.d.01.nis

Chn 116 Neh.d.01.nis 31 尼 希 米 书 尼 希 米 的 祷 告 以 下 是 哈 迦 利 亚 的 儿 子 尼 希 米 所 1 说 的 话 亚 达 薛 西 王 朝 二 十 年 基 斯 流 月 *, 我 住 在 京 城 书 珊 城 里 2 我 的 兄 弟 哈 拿 尼 和 其 他 一 些 人 从 犹 大 来 到 书 珊 城 我 向 他 们 打 听 那 些 劫 后 幸 存 的 犹 太 人 家 族 和 耶 路 撒 冷 的 情 形

More information

Microsoft Word - TIP006SCH Uni-edit Writing Tip - Presentperfecttenseandpasttenseinyourintroduction readytopublish

Microsoft Word - TIP006SCH Uni-edit Writing Tip - Presentperfecttenseandpasttenseinyourintroduction readytopublish 我 难 度 : 高 级 对 们 现 不 在 知 仍 道 有 听 影 过 响 多 少 那 次 么 : 研 英 究 过 文 论 去 写 文 时 作 的 表 技 引 示 巧 言 事 : 部 情 引 分 发 言 该 生 使 在 中 用 过 去, 而 现 在 完 成 时 仅 表 示 事 情 发 生 在 过 去, 并 的 哪 现 种 在 时 完 态 成 呢 时? 和 难 过 道 去 不 时 相 关? 是 所 有

More information

1.ai

1.ai HDMI camera ARTRAY CO,. LTD Introduction Thank you for purchasing the ARTCAM HDMI camera series. This manual shows the direction how to use the viewer software. Please refer other instructions or contact

More information

第1章 簡介

第1章 簡介 EAN.UCCThe Global Language of Business 4 512345 678906 > 0 12345 67890 5 < > 1 89 31234 56789 4 ( 01) 04601234567893 EAN/UCC-14: 15412150000151 EAN/UCC-13: 5412150000161 EAN/UCC-14: 25412150000158 EAN/UCC-13:

More information

數學導論 學數學 前言 學 學 數學 學 數學. 學數學 論. 學,. (Logic), (Set) 數 (Function)., 學 論. 論 學 數學.,,.,.,., 論,.,. v Chapter 1 Basic Logic 學 數學 學 言., logic. 學 學,, 學., 學 數學. 數學 論 statement. 2 > 0 statement, 3 < 2 statement

More information

Microsoft Word - 11月電子報1130.doc

Microsoft Word - 11月電子報1130.doc 發 行 人 : 楊 進 成 出 刊 日 期 2008 年 12 月 1 日, 第 38 期 第 1 頁 / 共 16 頁 封 面 圖 話 來 來 來, 來 葳 格 ; 玩 玩 玩, 玩 數 學 在 11 月 17 到 21 日 這 5 天 裡 每 天 一 個 題 目, 孩 子 們 依 據 不 同 年 段, 尋 找 屬 於 自 己 的 解 答, 這 些 數 學 題 目 和 校 園 情 境 緊 緊 結

More information

untitled

untitled 28 12 17 28.68 2.6 3883.39 3 1994.45 1975.1 725.32 2736.3 1998 8998 6998 4998 2998 71217 8317 8611 891 81128 3 1 : 28.12.2 2 VS :4 28.1.5 3 28.7.14 9 1999-28 1 1 29 1 2 3 4 5 29 2 29 2 29 (8621)6138276

More information

可 愛 的 動 物 小 五 雷 雅 理 第 一 次 小 六 甲 黃 駿 朗 今 年 暑 假 發 生 了 一 件 令 人 非 常 難 忘 的 事 情, 我 第 一 次 參 加 宿 營, 離 開 父 母, 自 己 照 顧 自 己, 出 發 前, 我 的 心 情 十 分 緊 張 當 到 達 目 的 地 後

可 愛 的 動 物 小 五 雷 雅 理 第 一 次 小 六 甲 黃 駿 朗 今 年 暑 假 發 生 了 一 件 令 人 非 常 難 忘 的 事 情, 我 第 一 次 參 加 宿 營, 離 開 父 母, 自 己 照 顧 自 己, 出 發 前, 我 的 心 情 十 分 緊 張 當 到 達 目 的 地 後 郭家朗 許鈞嵐 劉振迪 樊偉賢 林洛鋒 第 36 期 出版日期 28-3-2014 出版日期 28-3-2014 可 愛 的 動 物 小 五 雷 雅 理 第 一 次 小 六 甲 黃 駿 朗 今 年 暑 假 發 生 了 一 件 令 人 非 常 難 忘 的 事 情, 我 第 一 次 參 加 宿 營, 離 開 父 母, 自 己 照 顧 自 己, 出 發 前, 我 的 心 情 十 分 緊 張 當 到 達 目

More information

... 1... 3... 8... 10... 16... 28... 38... 180 China Petroleum & Chemical Corporation Sinopec Corp. 100029 86-10-64990060 86-10-64990022 http://www.sinopec.com.cn ir@sinopec.com.cn media@sinopec.com.cn

More information

Windows XP

Windows XP Windows XP What is Windows XP Windows is an Operating System An Operating System is the program that controls the hardware of your computer, and gives you an interface that allows you and other programs

More information

中国科学技术大学学位论文模板示例文档

中国科学技术大学学位论文模板示例文档 University of Science and Technology of China A dissertation for doctor s degree An Example of USTC Thesis Template for Bachelor, Master and Doctor Author: Zeping Li Speciality: Mathematics and Applied

More information

Logitech Wireless Combo MK45 English

Logitech Wireless Combo MK45 English Logitech Wireless Combo MK45 Setup Guide Logitech Wireless Combo MK45 English................................................................................... 7..........................................

More information

运动员治疗用药豁免申报审批办法

运动员治疗用药豁免申报审批办法 运 动 员 治 疗 用 药 豁 免 管 理 办 法 第 一 条 为 了 保 护 运 动 员 的 身 心 健 康, 保 证 运 动 员 的 伤 病 得 到 及 时 安 全 的 治 疗, 保 障 运 动 员 公 平 参 与 体 育 运 动 的 权 利, 根 据 国 务 院 反 兴 奋 剂 条 例, 参 照 世 界 反 兴 奋 剂 条 例 和 治 疗 用 药 豁 免 国 际 标 准 的 有 关 条 款,

More information