@@ -31,7 +31,8 @@ start.nanoListener <- function(x, quietly = TRUE, ...) {
3131 if (xc ) {
3232 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
3333 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
34- cat(format.POSIXct(Sys.time()), " [ listener start ]" , attr(x , " url" ))
34+ cat(format.POSIXct(Sys.time()), " [ list start ] sock:" ,
35+ attr(x , " socket" ), " | url:" , attr(x , " url" ), " \n " )
3536 }
3637 invisible (xc )
3738
@@ -47,7 +48,8 @@ start.nanoDialer <- function(x, async = TRUE, quietly = TRUE, ...) {
4748 if (xc ) {
4849 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
4950 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
50- cat(format.POSIXct(Sys.time()), " [ dialer start ]" , attr(x , " url" ))
51+ cat(format.POSIXct(Sys.time()), " [ dial start ] sock:" ,
52+ attr(x , " socket" ), " | url:" , attr(x , " url" ), " \n " )
5153 }
5254 invisible (xc )
5355
@@ -95,8 +97,8 @@ close.nanoSocket <- function(con, quietly = TRUE, ...) {
9597 if (xc ) {
9698 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
9799 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
98- cat(format.POSIXct(Sys.time()), " [ socket close ] id:" ,
99- attr(con , " id" ), " | protocol:" , attr(con , " protocol" ))
100+ cat(format.POSIXct(Sys.time()), " [ sock close ] id:" ,
101+ attr(con , " id" ), " | protocol:" , attr(con , " protocol" ), " \n " )
100102 }
101103 invisible (xc )
102104
@@ -112,8 +114,8 @@ close.nanoContext <- function(con, quietly = TRUE, ...) {
112114 if (xc ) {
113115 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
114116 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
115- cat(format.POSIXct(Sys.time()), " [ context close ] id:" ,
116- attr(con , " id" ), " | socket :" , attr(con , " socket" ))
117+ cat(format.POSIXct(Sys.time()), " [ ctxt close ] id:" ,
118+ attr(con , " id" ), " | sock :" , attr(con , " socket" ), " \n " )
117119 }
118120 invisible (xc )
119121
@@ -129,7 +131,8 @@ close.nanoDialer <- function(con, quietly = TRUE, ...) {
129131 if (xc ) {
130132 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
131133 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
132- cat(format.POSIXct(Sys.time()), " [ dialer close ]" , attr(con , " url" ))
134+ cat(format.POSIXct(Sys.time()), " [ dial start ] sock:" ,
135+ attr(con , " socket" ), " | url:" , attr(con , " url" ), " \n " )
133136 }
134137
135138 invisible (xc )
@@ -146,7 +149,8 @@ close.nanoListener <- function(con, quietly = TRUE, ...) {
146149 if (xc ) {
147150 message(Sys.time(), " [ " , xc , " ] " , nng_error(xc ))
148151 } else if (! missing(quietly ) && ! isTRUE(quietly )) {
149- cat(format.POSIXct(Sys.time()), " [ listener close ]" , attr(con , " url" ))
152+ cat(format.POSIXct(Sys.time()), " [ list close ] sock:" ,
153+ attr(con , " socket" ), " | url:" , attr(con , " url" ), " \n " )
150154 }
151155
152156 invisible (xc )
0 commit comments