在表中插入长文本时访问VBA错误

时间:2019-03-15 09:50:52

标签: vba ms-access insert

在Access中,我有2个表table_A和table_B。在table_A的col2中,我有一个R函数作为单元格值。

mdPatternChart<-function (x, Str_PathFile) 
{
  if (!(is.matrix(x) || is.data.frame(x))) 
    stop("Data should be a matrix or dataframe")
  if (ncol(x) < 2) 
    stop("Data should have at least two columns")
  R <- is.na(x)
  nmis <- colSums(R)
  R <- matrix(R[, order(nmis)], dim(x))
  pat <- apply(R, 1, function(x) paste(as.numeric(x), collapse = ""))
  sortR <- matrix(R[order(pat), ], dim(x))

  if (nrow(x) == 1) {
    mpat <- is.na(x)
  } else {
    mpat <- sortR[!duplicated(sortR), ]
  }

  if (all(!is.na(x))) {    cat(" /\\     /\\\n{  `---'  }\n{  O   O  }\n==>  V <==")
    cat("  No need for mice. This data set is completely observed.\n")
    cat(" \\  \\|/  /\n  `-----'\n\n")
    mpat <- t(as.matrix(mpat, byrow = TRUE))
    rownames(mpat) <- table(pat)
  } else {
    if (is.null(dim(mpat))) {
      mpat <- t(as.matrix(mpat))
    }
    rownames(mpat) <- table(pat)
  }
  r <- cbind(abs(mpat - 1), rowSums(mpat))
  r <- rbind(r, c(nmis[order(nmis)], sum(nmis)))

  png(file=paste(Str_PathFile,".png",sep=""),bg="transparent")
    plot.new()
    if (is.null(dim(sortR[!duplicated(sortR), ]))) {
      R <- t(as.matrix(r[1:nrow(r) - 1, 1:ncol(r) - 1]))
    } else {
      if (is.null(dim(R))) {
        R <- t(as.matrix(R))
      }
      R <- r[1:nrow(r) - 1, 1:ncol(r) - 1]
    }
    par(mar = rep(0, 4))
    plot.window(xlim = c(-1, ncol(R) + 1), ylim = c(-1, nrow(R) + 
                                                      1), asp = 1)
    M <- cbind(c(row(R)), c(col(R))) - 1
    shade <- ifelse(R[nrow(R):1, ], mdc(1), mdc(2))
    rect(M[, 2], M[, 1], M[, 2] + 1, M[, 1] + 1, col = shade)
    adj = c(0, 0.5)
    srt = 90
    for (i in 1:ncol(R)) {
      text(i - 0.5, nrow(R) + 0.3, colnames(r)[i], adj = adj, 
           srt = srt)
      text(i - 0.5, -0.3, nmis[order(nmis)][i])
    }
    for (i in 1:nrow(R)) {
      text(ncol(R) + 0.3, i - 0.5, r[(nrow(r) - 1):1, ncol(r)][i], 
           adj = 0)
      text(-0.3, i - 0.5, rownames(r)[(nrow(r) - 1):1][i], 
           adj = 1)
    }
    text(ncol(R) + 0.3, -0.3, r[nrow(r), ncol(r)])
    dev.off()
}

现在,我要将其插入到table_B的col2中。两个表中的Col2均为memo。它的作用是

CurrentDb.Execute "insert into Table_B (Col1,Col2) select Col1,Col2 from Table_A"

但是,如果我按如下方式使用DAO.recordset,则此方法不起作用。

CurrentDb.Execute "insert into Table_B (Co1,Col2) values (2,'" & Rs_TableA.Fields("Col2") & "')"

它给出了运行时错误3075,表明语法有问题。我换了!和“在函数中,但是它不起作用。我还尝试了在插入之前将其值保存在字符串变量中的方法,但是它也不起作用。由于我需要遍历table_A,有人可以帮忙吗?谢谢!

enter image description here

1 个答案:

答案 0 :(得分:0)

函数文本包含撇号和引号字符。这些字符在SQL语句中具有特殊含义。 SELECT子查询不会有问题,但是从记录集提取的构造SQL值试图将它们作为特殊字符而不只是简单文本进行处理。这使编译后的语句对SQL引擎毫无意义。审核How do I escape a single quote in SQL Server?

处理选项:

  1. Replace(Replace([fieldname], "'", "''"), Chr(34), Chr(34) & Chr(34))

  2. 打开源记录集和目标记录集,遍历源代码并使用AddNew和Update将记录写入目标

  3. 也许SELECT子查询版本实际上可以满足要求,并且ID是否应由文本框动态提供:
    CurrentDb.Execute "INSERT INTO Table_B (Col1,Col2) SELECT " & Me.tbxID & " As C1, Col2 FROM Table_A"

此外,我认为应该有2个倾斜的撇号。