2016-12-14 69 views
2

我有以下代碼用於查找兩個位置之間的旅行時間。我使用vba來調用腳本,這就是爲什麼命令參數顯示在頂部,但出於測試目的,我只是設置變量。這是工作到今天(沒有改變任何東西),現在我一直運行結果行時出現此錯誤:rowXML [[dur]]中的錯誤:下標超出範圍。R代碼gmapsdistance

有沒有人有任何想法是什麼可能導致這個或它的意思?

代碼:

#install and load necessary packages 
#install.packages("gmapsdistance") 
#install.packages("devtools") 

args<-commandArgs(trailingOnly=T) 

library("gmapsdistance") 
library("devtools") 
devtools::install_github("rodazuero/gmapsdistance") 

#input variables from excel 
orig <- args[1] 
dest <- args[2] 
filePath <- args[3] 
api_key <- args[4] 

orig <- "London" 
dest <- "Paris" 
filePath <- "C:/Users/gabby/Documents/SeniorYear/SeniorDesign/TravelTimes/Travel_Times.csv" 
api_key <- "############################" 

set.api.key(api_key) 

#calls google maps and finds the time 
results = gmapsdistance(origin = c(orig, dest), destination = c(dest, orig), mode = "driving", traffic_model = "best_guess", 
         key = api_key, combinations = "pairwise", shape = "wide") 

#put results in a data frame 
results2 <- data.frame(results) 

#rename the column headings 
names(results2) <- c("Origin","Destination", "Time", "X1","X2","Distance","X3","X4","Status") 

#delete repeated origin/destination columns 
results2$X1 <- NULL 
results2$X2 <- NULL 
results2$X3 <- NULL 
results2$X4 <- NULL 

#convert seconds to minutes 
results2$Time <- results2$Time/60 

#convert meters to miles 
results2$Distance <- results2$Distance*0.000621371 

#add extra column and input the current date/time for documentation 
results2[,"Date"] <- NA 
results2[1,"Date"] <- format(Sys.time(), "%a %b %d %X %Y %Z") 

#write results2 to a csv file and save it in my folder 
write.csv(results2, file = filePath) 
+0

檢查在谷歌API控制檯您是否已經超出了配額一天 – SymbolixAU

+0

錯誤將從[這一行]現身(https://github.com/rodazuero/gmapsdistance/blob/831541fc8cd11e289f17daf4f23e332b3356f252/ R/gmapsdistance.R#L258),這對我來說建議API調用失敗,因此沒有'duration'值 – SymbolixAU

+0

你也可以在我的['googleway']上測試你的代碼(https://cran.r-project .org/web/packages/googleway/index.html)包也稱爲Google Maps API。如果它在兩個軟件包上均失敗,則表明該問題不在R代碼 – SymbolixAU

回答

1

我獲得API密鑰,複製你的問題,然後通過線底層函數的源代碼行加強。

該錯誤是由以下引起的:​​

data$Time[i] = as(rowXML[[dur]][1L]$value[1L]$text, 
         "numeric") 

因爲對象dur僅包含以下內容:

> dur 
[1] "duration"   "duration_in_traffic" 

因此rowXML[[dur]]引發錯誤。我不知道在哪裏指向手指,但API的變化通常比圍繞它們構建的包更快。

儘管如此,您仍然可以使用源代碼來獲得您的結果。它只是需要幾行代碼,清理結果自己:

xmlChildren(results$row[[1L]]) 
$status 
<status>OK</status> 

$duration 
<duration> 
    <value>20185</value> 
    <text>5 hours 36 mins</text> 
</duration> 

$distance 
<distance> 
    <value>459271</value> 
    <text>459 km</text> 
</distance> 

$duration_in_traffic 
<duration_in_traffic> 
    <value>20957</value> 
    <text>5 hours 49 mins</text> 
</duration_in_traffic> 

attr(,"class") 
[1] "XMLInternalNodeList" "XMLNodeList" 

根據您的要求在評論,這裏有一點關於我做得到這一點。

首先,從調用這個函數的參數,並創建對象(即只是運行每個參數作爲一個單獨的命令來創建對象)。接下來,加載XMLRcurl庫。另外,將您的API密鑰放入一個名爲key的對象中。

之後,您只需取出函數的源代碼並逐行運行,即可跳過定義函數調用的部分。一路上有少量未使用的參數,您可以創建並設置爲""

# function (origin, destination, combinations = "all", mode, key = #get.api.key(), 
#    shape = "wide", avoid = "", departure = "now", dep_date = "", 
#    dep_time = "", traffic_model = "best_guess", arrival = "", 
#    arr_date = "", arr_time = "") # don't run this 
if (!(mode %in% c("driving", "walking", "bicycling", "transit"))) { 
    stop("Mode of transportation not recognized. Mode should be one of ", 
     "'bicycling', 'transit', 'driving', 'walking' ") 

    if (!(combinations %in% c("all", "pairwise"))) { 
    stop("Combinations between origin and destination not recognized. Combinations should be one of ", 
     "'all', 'pairwise' ") 
    } 
    if (!(avoid %in% c("", "tolls", "highways", "ferries", "indoor"))) { 
    stop("Avoid parameters not recognized. Avoid should be one of ", 
     "'tolls', 'highways', 'ferries', 'indoor' ") 
    } 
    if (!(traffic_model %in% c("best_guess", "pessimistic", "optimistic"))) { 
    stop("Traffic model not recognized. Traffic model should be one of ", 
     "'best_guess', 'pessimistic', 'optimistic'") 
    } 
    seconds = "now" 
    seconds_arrival = "" 
    UTCtime = strptime("1970-01-01 00:00:00", "%Y-%m-%d %H:%M:%OS", 
        tz = "GMT") 
    min_secs = round(as.numeric(difftime(as.POSIXlt(Sys.time(), 
                "GMT"), UTCtime, units = "secs"))) 
    if (dep_date != "" && dep_time != "") { 
    depart = strptime(paste(dep_date, dep_time), "%Y-%m-%d %H:%M:%OS", 
         tz = "GMT") 
    seconds = round(as.numeric(difftime(depart, UTCtime, 
             units = "secs"))) 
    } 
    if (departure != "now") { 
    seconds = departure 
    } 
    if (departure != "now" && departure < min_secs) { 
    stop("The departure time has to be some time in the future!") 
    } 
    if (dep_date != "" && dep_time == "") { 
    stop("You should also specify a departure time in the format HH:MM:SS UTC") 
    } 
    if (dep_date == "" && dep_time != "") { 
    stop("You should also specify a departure date in the format YYYY-MM-DD UTC") 
    } 
    if (dep_date != "" && dep_time != "" && seconds < min_secs) { 
    stop("The departure time has to be some time in the future!") 
    } 
    if (arr_date != "" && arr_time != "") { 
    arriv = strptime(paste(arr_date, arr_time), "%Y-%m-%d %H:%M:%OS", 
        tz = "GMT") 
    seconds_arrival = round(as.numeric(difftime(arriv, UTCtime, 
               units = "secs"))) 
    } 
    if (arrival != "") { 
    seconds_arrival = arrival 
    } 
    if (arrival != "" && arrival < min_secs) { 
    stop("The arrival time has to be some time in the future!") 
    } 
    if (arr_date != "" && arr_time == "") { 
    stop("You should also specify an arrival time in the format HH:MM:SS UTC") 
    } 
    if (arr_date == "" && arr_time != "") { 
    stop("You should also specify an arrival date in the format YYYY-MM-DD UTC") 
    } 
    if (arr_date != "" && arr_time != "" && seconds_arrival < 
     min_secs) { 
    stop("The arrival time has to be some time in the future!") 
    } 
    if ((dep_date != "" || dep_time != "" || departure != "now") && 
     (arr_date != "" || arr_time != "" || arrival != "")) { 
    stop("Cannot input departure and arrival times. Only one can be used at a time. ") 
    } 
    if (combinations == "pairwise" && length(origin) != length(destination)) { 
    stop("Size of origin and destination vectors must be the same when using the option: combinations == 'pairwise'") 
    } 
    if (combinations == "all") { 
    data = expand.grid(or = origin, de = destination) 
    } 
    else if (combinations == "pairwise") { 
    data = data.frame(or = origin, de = destination) 
    } 
    n = dim(data) 
    n = n[1] 
    data$Time = NA 
    data$Distance = NA 
    data$status = "OK" 
    avoidmsg = "" 
    if (avoid != "") { 
    avoidmsg = paste0("&avoid=", avoid) 
    } 











    for (i in 1:1:n) { 
    url = paste0("maps.googleapis.com/maps/api/distancematrix/xml?origins=", 
       data$or[i], "&destinations=", data$de[i], "&mode=", 
       mode, "&sensor=", "false", "&units=metric", "&departure_time=", 
       seconds, "&traffic_model=", traffic_model, avoidmsg) 
    if (!is.null(key)) { 
     key = gsub(" ", "", key) 
     url = paste0("https://", url, "&key=", key) 
    } 
    else { 
     url = paste0("http://", url) 
    } 
    webpageXML = xmlParse(getURL(url)) 
    results = xmlChildren(xmlRoot(webpageXML)) 
    request.status = as(unlist(results$status[[1]]), "character") 
    if (!is.null(results$error_message)) { 
     stop(paste(c("Google API returned an error: ", xmlValue(results$error_message)), 
       sep = "")) 
    } 
    if (request.status == "REQUEST_DENIED") { 
     set.api.key(NULL) 
     data$status[i] = "REQUEST_DENIED" 
    } 
    rowXML = xmlChildren(results$row[[1L]]) 
    Status = as(rowXML$status[1]$text, "character") 
    if (Status == "ZERO_RESULTS") { 
     data$status[i] = "ROUTE_NOT_FOUND" 
    } 
    if (Status == "NOT_FOUND") { 
     data$status[i] = "PLACE_NOT_FOUND" 
    } 
    if (Status == "OVER_QUERY_LIMIT") { 
     stop("You have exceeded your allocation of API requests for today.") 
    } 
    if (data$status[i] == "OK") { 
     data$Distance[i] = as(rowXML$distance[1]$value[1]$text, 
          "numeric") 
     dur = grep("duration", names(rowXML), value = TRUE) 
     data$Time[i] = as(rowXML[[dur]][1L]$value[1L]$text, 
         "numeric") 
    } 
    } 


    datadist = data[c("or", "de", "Distance")] 
    datatime = data[c("or", "de", "Time")] 
    datastat = data[c("or", "de", "status")] 
    if (n > 1) { 
    if (shape == "wide" && combinations == "all") { 
     Distance = reshape(datadist, timevar = "de", idvar = c("or"), 
         direction = "wide") 
     Time = reshape(datatime, timevar = "de", idvar = c("or"), 
        direction = "wide") 
     Stat = reshape(datastat, timevar = "de", idvar = c("or"), 
        direction = "wide") 
    } 
    else { 
     Distance = datadist 
     Time = datatime 
     Stat = datastat 
    } 
    } 
    else { 
    Distance = data$Distance[i] 
    Time = data$Time[i] 
    Stat = data$status[i] 
    } 
    output = list(Time = Time, Distance = Distance, Status = Stat) 
+0

你介意分享一下你添加的代碼嗎? –

+0

@GabbyPotvin當然,沒問題,只需一秒鐘。 –

+0

謝謝!我很抱歉,我對此非常陌生......代碼去哪兒了? –

-1

如果你不限制使用gmapsdistance,我googleway包會給你同樣的結果。唯一的區別是您目前必須指定departure_time

library(googleway) 

orig <- "London" 
dest <- "Paris" 
api_key <- "your_api_key" 

result <- google_distance(origin = c(orig, dest), destination = c(orig, dest), 
         mode = "driving", 
         traffic_model = "best_guess", 
         departure_time = Sys.time() + 60, 
         key = api_key) 


result$rows$elements 
# [[1]] 
# distance.text distance.value duration.text duration.value status 
# 1   1 m    0   1 min    0  OK 
# 2  459 km   459271 5 hours 36 mins   20185  OK 
# 
# [[2]] 
# distance.text distance.value duration.text duration.value status 
# 1  470 km   470366 5 hours 25 mins   19484  OK 
# 2   1 m    0   1 min    0  OK 
+0

@GabbyPotvin沒問題 - 只是在演示之前,不是真正的代碼打破的理想時間:) – SymbolixAU

+0

我知道!令人沮喪!我繼續跑,但得到了以下錯誤:在match.arg(traffic_model)錯誤:'arg'應該是 –

+0

@GabbyPotvin哈 - 哦是的,我修正了[該錯誤](https://github.com/SymbolixAU/googleway/issues/16)在開發版本中,所以它還沒有啓動。如果你想要,你可以通過'library(devtools)來獲得它; install_github(「SymbolixAU/googleway」)' - 在開發版本中,我也一直在繪製交互式谷歌地圖 – SymbolixAU